module Stratosphere.OpenSearchService.Domain.AdvancedSecurityOptionsInputProperty (
module Exports, AdvancedSecurityOptionsInputProperty(..),
mkAdvancedSecurityOptionsInputProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.OpenSearchService.Domain.IAMFederationOptionsProperty as Exports
import {-# SOURCE #-} Stratosphere.OpenSearchService.Domain.JWTOptionsProperty as Exports
import {-# SOURCE #-} Stratosphere.OpenSearchService.Domain.MasterUserOptionsProperty as Exports
import {-# SOURCE #-} Stratosphere.OpenSearchService.Domain.SAMLOptionsProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data AdvancedSecurityOptionsInputProperty
=
AdvancedSecurityOptionsInputProperty {AdvancedSecurityOptionsInputProperty -> ()
haddock_workaround_ :: (),
AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthDisableDate :: (Prelude.Maybe (Value Prelude.Text)),
AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
anonymousAuthEnabled :: (Prelude.Maybe (Value Prelude.Bool)),
AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: (Prelude.Maybe (Value Prelude.Bool)),
AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
iAMFederationOptions :: (Prelude.Maybe IAMFederationOptionsProperty),
AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
internalUserDatabaseEnabled :: (Prelude.Maybe (Value Prelude.Bool)),
AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
jWTOptions :: (Prelude.Maybe JWTOptionsProperty),
AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
masterUserOptions :: (Prelude.Maybe MasterUserOptionsProperty),
AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
sAMLOptions :: (Prelude.Maybe SAMLOptionsProperty)}
deriving stock (AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool
(AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool)
-> (AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool)
-> Eq AdvancedSecurityOptionsInputProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool
== :: AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool
$c/= :: AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool
/= :: AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty -> Bool
Prelude.Eq, Int -> AdvancedSecurityOptionsInputProperty -> ShowS
[AdvancedSecurityOptionsInputProperty] -> ShowS
AdvancedSecurityOptionsInputProperty -> String
(Int -> AdvancedSecurityOptionsInputProperty -> ShowS)
-> (AdvancedSecurityOptionsInputProperty -> String)
-> ([AdvancedSecurityOptionsInputProperty] -> ShowS)
-> Show AdvancedSecurityOptionsInputProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AdvancedSecurityOptionsInputProperty -> ShowS
showsPrec :: Int -> AdvancedSecurityOptionsInputProperty -> ShowS
$cshow :: AdvancedSecurityOptionsInputProperty -> String
show :: AdvancedSecurityOptionsInputProperty -> String
$cshowList :: [AdvancedSecurityOptionsInputProperty] -> ShowS
showList :: [AdvancedSecurityOptionsInputProperty] -> ShowS
Prelude.Show)
mkAdvancedSecurityOptionsInputProperty ::
AdvancedSecurityOptionsInputProperty
mkAdvancedSecurityOptionsInputProperty :: AdvancedSecurityOptionsInputProperty
mkAdvancedSecurityOptionsInputProperty
= AdvancedSecurityOptionsInputProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthDisableDate = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
anonymousAuthEnabled :: Maybe (Value Bool)
anonymousAuthEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing, enabled :: Maybe (Value Bool)
enabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
iAMFederationOptions = Maybe IAMFederationOptionsProperty
forall a. Maybe a
Prelude.Nothing,
internalUserDatabaseEnabled :: Maybe (Value Bool)
internalUserDatabaseEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
jWTOptions :: Maybe JWTOptionsProperty
jWTOptions = Maybe JWTOptionsProperty
forall a. Maybe a
Prelude.Nothing, masterUserOptions :: Maybe MasterUserOptionsProperty
masterUserOptions = Maybe MasterUserOptionsProperty
forall a. Maybe a
Prelude.Nothing,
sAMLOptions :: Maybe SAMLOptionsProperty
sAMLOptions = Maybe SAMLOptionsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties AdvancedSecurityOptionsInputProperty where
toResourceProperties :: AdvancedSecurityOptionsInputProperty -> ResourceProperties
toResourceProperties AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::OpenSearchService::Domain.AdvancedSecurityOptionsInput",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AnonymousAuthDisableDate"
(Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
anonymousAuthDisableDate,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AnonymousAuthEnabled" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
anonymousAuthEnabled,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Enabled" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enabled,
Key -> IAMFederationOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IAMFederationOptions" (IAMFederationOptionsProperty -> (Key, Value))
-> Maybe IAMFederationOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe IAMFederationOptionsProperty
iAMFederationOptions,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InternalUserDatabaseEnabled"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
internalUserDatabaseEnabled,
Key -> JWTOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"JWTOptions" (JWTOptionsProperty -> (Key, Value))
-> Maybe JWTOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe JWTOptionsProperty
jWTOptions,
Key -> MasterUserOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MasterUserOptions" (MasterUserOptionsProperty -> (Key, Value))
-> Maybe MasterUserOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MasterUserOptionsProperty
masterUserOptions,
Key -> SAMLOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SAMLOptions" (SAMLOptionsProperty -> (Key, Value))
-> Maybe SAMLOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SAMLOptionsProperty
sAMLOptions])}
instance JSON.ToJSON AdvancedSecurityOptionsInputProperty where
toJSON :: AdvancedSecurityOptionsInputProperty -> Value
toJSON AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AnonymousAuthDisableDate"
(Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
anonymousAuthDisableDate,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AnonymousAuthEnabled" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
anonymousAuthEnabled,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Enabled" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
enabled,
Key -> IAMFederationOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IAMFederationOptions" (IAMFederationOptionsProperty -> (Key, Value))
-> Maybe IAMFederationOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe IAMFederationOptionsProperty
iAMFederationOptions,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InternalUserDatabaseEnabled"
(Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
internalUserDatabaseEnabled,
Key -> JWTOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"JWTOptions" (JWTOptionsProperty -> (Key, Value))
-> Maybe JWTOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe JWTOptionsProperty
jWTOptions,
Key -> MasterUserOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MasterUserOptions" (MasterUserOptionsProperty -> (Key, Value))
-> Maybe MasterUserOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MasterUserOptionsProperty
masterUserOptions,
Key -> SAMLOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SAMLOptions" (SAMLOptionsProperty -> (Key, Value))
-> Maybe SAMLOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SAMLOptionsProperty
sAMLOptions]))
instance Property "AnonymousAuthDisableDate" AdvancedSecurityOptionsInputProperty where
type PropertyType "AnonymousAuthDisableDate" AdvancedSecurityOptionsInputProperty = Value Prelude.Text
set :: PropertyType
"AnonymousAuthDisableDate" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType
"AnonymousAuthDisableDate" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthDisableDate = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"AnonymousAuthDisableDate" AdvancedSecurityOptionsInputProperty
Value Text
newValue, Maybe (Value Bool)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "AnonymousAuthEnabled" AdvancedSecurityOptionsInputProperty where
type PropertyType "AnonymousAuthEnabled" AdvancedSecurityOptionsInputProperty = Value Prelude.Bool
set :: PropertyType
"AnonymousAuthEnabled" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType
"AnonymousAuthEnabled" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{anonymousAuthEnabled :: Maybe (Value Bool)
anonymousAuthEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"AnonymousAuthEnabled" AdvancedSecurityOptionsInputProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "Enabled" AdvancedSecurityOptionsInputProperty where
type PropertyType "Enabled" AdvancedSecurityOptionsInputProperty = Value Prelude.Bool
set :: PropertyType "Enabled" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType "Enabled" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{enabled :: Maybe (Value Bool)
enabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Enabled" AdvancedSecurityOptionsInputProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "IAMFederationOptions" AdvancedSecurityOptionsInputProperty where
type PropertyType "IAMFederationOptions" AdvancedSecurityOptionsInputProperty = IAMFederationOptionsProperty
set :: PropertyType
"IAMFederationOptions" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType
"IAMFederationOptions" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{iAMFederationOptions :: Maybe IAMFederationOptionsProperty
iAMFederationOptions = IAMFederationOptionsProperty -> Maybe IAMFederationOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"IAMFederationOptions" AdvancedSecurityOptionsInputProperty
IAMFederationOptionsProperty
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "InternalUserDatabaseEnabled" AdvancedSecurityOptionsInputProperty where
type PropertyType "InternalUserDatabaseEnabled" AdvancedSecurityOptionsInputProperty = Value Prelude.Bool
set :: PropertyType
"InternalUserDatabaseEnabled" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType
"InternalUserDatabaseEnabled" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{internalUserDatabaseEnabled :: Maybe (Value Bool)
internalUserDatabaseEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"InternalUserDatabaseEnabled" AdvancedSecurityOptionsInputProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "JWTOptions" AdvancedSecurityOptionsInputProperty where
type PropertyType "JWTOptions" AdvancedSecurityOptionsInputProperty = JWTOptionsProperty
set :: PropertyType "JWTOptions" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType "JWTOptions" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{jWTOptions :: Maybe JWTOptionsProperty
jWTOptions = JWTOptionsProperty -> Maybe JWTOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "JWTOptions" AdvancedSecurityOptionsInputProperty
JWTOptionsProperty
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "MasterUserOptions" AdvancedSecurityOptionsInputProperty where
type PropertyType "MasterUserOptions" AdvancedSecurityOptionsInputProperty = MasterUserOptionsProperty
set :: PropertyType
"MasterUserOptions" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType
"MasterUserOptions" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{masterUserOptions :: Maybe MasterUserOptionsProperty
masterUserOptions = MasterUserOptionsProperty -> Maybe MasterUserOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"MasterUserOptions" AdvancedSecurityOptionsInputProperty
MasterUserOptionsProperty
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
instance Property "SAMLOptions" AdvancedSecurityOptionsInputProperty where
type PropertyType "SAMLOptions" AdvancedSecurityOptionsInputProperty = SAMLOptionsProperty
set :: PropertyType "SAMLOptions" AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
-> AdvancedSecurityOptionsInputProperty
set PropertyType "SAMLOptions" AdvancedSecurityOptionsInputProperty
newValue AdvancedSecurityOptionsInputProperty {Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
Maybe SAMLOptionsProperty
()
haddock_workaround_ :: AdvancedSecurityOptionsInputProperty -> ()
anonymousAuthDisableDate :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Text)
anonymousAuthEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
enabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
iAMFederationOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: AdvancedSecurityOptionsInputProperty -> Maybe (Value Bool)
jWTOptions :: AdvancedSecurityOptionsInputProperty -> Maybe JWTOptionsProperty
masterUserOptions :: AdvancedSecurityOptionsInputProperty
-> Maybe MasterUserOptionsProperty
sAMLOptions :: AdvancedSecurityOptionsInputProperty -> Maybe SAMLOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
sAMLOptions :: Maybe SAMLOptionsProperty
..}
= AdvancedSecurityOptionsInputProperty
{sAMLOptions :: Maybe SAMLOptionsProperty
sAMLOptions = SAMLOptionsProperty -> Maybe SAMLOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SAMLOptions" AdvancedSecurityOptionsInputProperty
SAMLOptionsProperty
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe IAMFederationOptionsProperty
Maybe JWTOptionsProperty
Maybe MasterUserOptionsProperty
()
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
haddock_workaround_ :: ()
anonymousAuthDisableDate :: Maybe (Value Text)
anonymousAuthEnabled :: Maybe (Value Bool)
enabled :: Maybe (Value Bool)
iAMFederationOptions :: Maybe IAMFederationOptionsProperty
internalUserDatabaseEnabled :: Maybe (Value Bool)
jWTOptions :: Maybe JWTOptionsProperty
masterUserOptions :: Maybe MasterUserOptionsProperty
..}