module Stratosphere.SageMaker.Workteam.CognitoMemberDefinitionProperty (
CognitoMemberDefinitionProperty(..),
mkCognitoMemberDefinitionProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data CognitoMemberDefinitionProperty
=
CognitoMemberDefinitionProperty {CognitoMemberDefinitionProperty -> ()
haddock_workaround_ :: (),
CognitoMemberDefinitionProperty -> Value Text
cognitoClientId :: (Value Prelude.Text),
CognitoMemberDefinitionProperty -> Value Text
cognitoUserGroup :: (Value Prelude.Text),
CognitoMemberDefinitionProperty -> Value Text
cognitoUserPool :: (Value Prelude.Text)}
deriving stock (CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool
(CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool)
-> (CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool)
-> Eq CognitoMemberDefinitionProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool
== :: CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool
$c/= :: CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool
/= :: CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty -> Bool
Prelude.Eq, Int -> CognitoMemberDefinitionProperty -> ShowS
[CognitoMemberDefinitionProperty] -> ShowS
CognitoMemberDefinitionProperty -> String
(Int -> CognitoMemberDefinitionProperty -> ShowS)
-> (CognitoMemberDefinitionProperty -> String)
-> ([CognitoMemberDefinitionProperty] -> ShowS)
-> Show CognitoMemberDefinitionProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CognitoMemberDefinitionProperty -> ShowS
showsPrec :: Int -> CognitoMemberDefinitionProperty -> ShowS
$cshow :: CognitoMemberDefinitionProperty -> String
show :: CognitoMemberDefinitionProperty -> String
$cshowList :: [CognitoMemberDefinitionProperty] -> ShowS
showList :: [CognitoMemberDefinitionProperty] -> ShowS
Prelude.Show)
mkCognitoMemberDefinitionProperty ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> CognitoMemberDefinitionProperty
mkCognitoMemberDefinitionProperty :: Value Text
-> Value Text -> Value Text -> CognitoMemberDefinitionProperty
mkCognitoMemberDefinitionProperty
Value Text
cognitoClientId
Value Text
cognitoUserGroup
Value Text
cognitoUserPool
= CognitoMemberDefinitionProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), cognitoClientId :: Value Text
cognitoClientId = Value Text
cognitoClientId,
cognitoUserGroup :: Value Text
cognitoUserGroup = Value Text
cognitoUserGroup,
cognitoUserPool :: Value Text
cognitoUserPool = Value Text
cognitoUserPool}
instance ToResourceProperties CognitoMemberDefinitionProperty where
toResourceProperties :: CognitoMemberDefinitionProperty -> ResourceProperties
toResourceProperties CognitoMemberDefinitionProperty {()
Value Text
haddock_workaround_ :: CognitoMemberDefinitionProperty -> ()
cognitoClientId :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserGroup :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserPool :: CognitoMemberDefinitionProperty -> Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::SageMaker::Workteam.CognitoMemberDefinition",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"CognitoClientId" 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..= Value Text
cognitoClientId,
Key
"CognitoUserGroup" 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..= Value Text
cognitoUserGroup,
Key
"CognitoUserPool" 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..= Value Text
cognitoUserPool]}
instance JSON.ToJSON CognitoMemberDefinitionProperty where
toJSON :: CognitoMemberDefinitionProperty -> Value
toJSON CognitoMemberDefinitionProperty {()
Value Text
haddock_workaround_ :: CognitoMemberDefinitionProperty -> ()
cognitoClientId :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserGroup :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserPool :: CognitoMemberDefinitionProperty -> Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"CognitoClientId" 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..= Value Text
cognitoClientId,
Key
"CognitoUserGroup" 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..= Value Text
cognitoUserGroup,
Key
"CognitoUserPool" 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..= Value Text
cognitoUserPool]
instance Property "CognitoClientId" CognitoMemberDefinitionProperty where
type PropertyType "CognitoClientId" CognitoMemberDefinitionProperty = Value Prelude.Text
set :: PropertyType "CognitoClientId" CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty
set PropertyType "CognitoClientId" CognitoMemberDefinitionProperty
newValue CognitoMemberDefinitionProperty {()
Value Text
haddock_workaround_ :: CognitoMemberDefinitionProperty -> ()
cognitoClientId :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserGroup :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserPool :: CognitoMemberDefinitionProperty -> Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
..}
= CognitoMemberDefinitionProperty {cognitoClientId :: Value Text
cognitoClientId = PropertyType "CognitoClientId" CognitoMemberDefinitionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
haddock_workaround_ :: ()
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
..}
instance Property "CognitoUserGroup" CognitoMemberDefinitionProperty where
type PropertyType "CognitoUserGroup" CognitoMemberDefinitionProperty = Value Prelude.Text
set :: PropertyType "CognitoUserGroup" CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty
set PropertyType "CognitoUserGroup" CognitoMemberDefinitionProperty
newValue CognitoMemberDefinitionProperty {()
Value Text
haddock_workaround_ :: CognitoMemberDefinitionProperty -> ()
cognitoClientId :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserGroup :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserPool :: CognitoMemberDefinitionProperty -> Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
..}
= CognitoMemberDefinitionProperty {cognitoUserGroup :: Value Text
cognitoUserGroup = PropertyType "CognitoUserGroup" CognitoMemberDefinitionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserPool :: Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserPool :: Value Text
..}
instance Property "CognitoUserPool" CognitoMemberDefinitionProperty where
type PropertyType "CognitoUserPool" CognitoMemberDefinitionProperty = Value Prelude.Text
set :: PropertyType "CognitoUserPool" CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty
-> CognitoMemberDefinitionProperty
set PropertyType "CognitoUserPool" CognitoMemberDefinitionProperty
newValue CognitoMemberDefinitionProperty {()
Value Text
haddock_workaround_ :: CognitoMemberDefinitionProperty -> ()
cognitoClientId :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserGroup :: CognitoMemberDefinitionProperty -> Value Text
cognitoUserPool :: CognitoMemberDefinitionProperty -> Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
cognitoUserPool :: Value Text
..}
= CognitoMemberDefinitionProperty {cognitoUserPool :: Value Text
cognitoUserPool = PropertyType "CognitoUserPool" CognitoMemberDefinitionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
haddock_workaround_ :: ()
cognitoClientId :: Value Text
cognitoUserGroup :: Value Text
..}