module Stratosphere.EMR.StudioSessionMapping (
StudioSessionMapping(..), mkStudioSessionMapping
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data StudioSessionMapping
=
StudioSessionMapping {StudioSessionMapping -> ()
haddock_workaround_ :: (),
StudioSessionMapping -> Value Text
identityName :: (Value Prelude.Text),
StudioSessionMapping -> Value Text
identityType :: (Value Prelude.Text),
StudioSessionMapping -> Value Text
sessionPolicyArn :: (Value Prelude.Text),
StudioSessionMapping -> Value Text
studioId :: (Value Prelude.Text)}
deriving stock (StudioSessionMapping -> StudioSessionMapping -> Bool
(StudioSessionMapping -> StudioSessionMapping -> Bool)
-> (StudioSessionMapping -> StudioSessionMapping -> Bool)
-> Eq StudioSessionMapping
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: StudioSessionMapping -> StudioSessionMapping -> Bool
== :: StudioSessionMapping -> StudioSessionMapping -> Bool
$c/= :: StudioSessionMapping -> StudioSessionMapping -> Bool
/= :: StudioSessionMapping -> StudioSessionMapping -> Bool
Prelude.Eq, Int -> StudioSessionMapping -> ShowS
[StudioSessionMapping] -> ShowS
StudioSessionMapping -> String
(Int -> StudioSessionMapping -> ShowS)
-> (StudioSessionMapping -> String)
-> ([StudioSessionMapping] -> ShowS)
-> Show StudioSessionMapping
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> StudioSessionMapping -> ShowS
showsPrec :: Int -> StudioSessionMapping -> ShowS
$cshow :: StudioSessionMapping -> String
show :: StudioSessionMapping -> String
$cshowList :: [StudioSessionMapping] -> ShowS
showList :: [StudioSessionMapping] -> ShowS
Prelude.Show)
mkStudioSessionMapping ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> Value Prelude.Text -> StudioSessionMapping
mkStudioSessionMapping :: Value Text
-> Value Text -> Value Text -> Value Text -> StudioSessionMapping
mkStudioSessionMapping
Value Text
identityName
Value Text
identityType
Value Text
sessionPolicyArn
Value Text
studioId
= StudioSessionMapping
{haddock_workaround_ :: ()
haddock_workaround_ = (), identityName :: Value Text
identityName = Value Text
identityName,
identityType :: Value Text
identityType = Value Text
identityType, sessionPolicyArn :: Value Text
sessionPolicyArn = Value Text
sessionPolicyArn,
studioId :: Value Text
studioId = Value Text
studioId}
instance ToResourceProperties StudioSessionMapping where
toResourceProperties :: StudioSessionMapping -> ResourceProperties
toResourceProperties StudioSessionMapping {()
Value Text
haddock_workaround_ :: StudioSessionMapping -> ()
identityName :: StudioSessionMapping -> Value Text
identityType :: StudioSessionMapping -> Value Text
sessionPolicyArn :: StudioSessionMapping -> Value Text
studioId :: StudioSessionMapping -> Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::EMR::StudioSessionMapping",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"IdentityName" 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
identityName,
Key
"IdentityType" 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
identityType,
Key
"SessionPolicyArn" 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
sessionPolicyArn,
Key
"StudioId" 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
studioId]}
instance JSON.ToJSON StudioSessionMapping where
toJSON :: StudioSessionMapping -> Value
toJSON StudioSessionMapping {()
Value Text
haddock_workaround_ :: StudioSessionMapping -> ()
identityName :: StudioSessionMapping -> Value Text
identityType :: StudioSessionMapping -> Value Text
sessionPolicyArn :: StudioSessionMapping -> Value Text
studioId :: StudioSessionMapping -> Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"IdentityName" 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
identityName,
Key
"IdentityType" 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
identityType,
Key
"SessionPolicyArn" 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
sessionPolicyArn,
Key
"StudioId" 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
studioId]
instance Property "IdentityName" StudioSessionMapping where
type PropertyType "IdentityName" StudioSessionMapping = Value Prelude.Text
set :: PropertyType "IdentityName" StudioSessionMapping
-> StudioSessionMapping -> StudioSessionMapping
set PropertyType "IdentityName" StudioSessionMapping
newValue StudioSessionMapping {()
Value Text
haddock_workaround_ :: StudioSessionMapping -> ()
identityName :: StudioSessionMapping -> Value Text
identityType :: StudioSessionMapping -> Value Text
sessionPolicyArn :: StudioSessionMapping -> Value Text
studioId :: StudioSessionMapping -> Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
= StudioSessionMapping {identityName :: Value Text
identityName = PropertyType "IdentityName" StudioSessionMapping
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
haddock_workaround_ :: ()
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
instance Property "IdentityType" StudioSessionMapping where
type PropertyType "IdentityType" StudioSessionMapping = Value Prelude.Text
set :: PropertyType "IdentityType" StudioSessionMapping
-> StudioSessionMapping -> StudioSessionMapping
set PropertyType "IdentityType" StudioSessionMapping
newValue StudioSessionMapping {()
Value Text
haddock_workaround_ :: StudioSessionMapping -> ()
identityName :: StudioSessionMapping -> Value Text
identityType :: StudioSessionMapping -> Value Text
sessionPolicyArn :: StudioSessionMapping -> Value Text
studioId :: StudioSessionMapping -> Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
= StudioSessionMapping {identityType :: Value Text
identityType = PropertyType "IdentityType" StudioSessionMapping
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
identityName :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
haddock_workaround_ :: ()
identityName :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
instance Property "SessionPolicyArn" StudioSessionMapping where
type PropertyType "SessionPolicyArn" StudioSessionMapping = Value Prelude.Text
set :: PropertyType "SessionPolicyArn" StudioSessionMapping
-> StudioSessionMapping -> StudioSessionMapping
set PropertyType "SessionPolicyArn" StudioSessionMapping
newValue StudioSessionMapping {()
Value Text
haddock_workaround_ :: StudioSessionMapping -> ()
identityName :: StudioSessionMapping -> Value Text
identityType :: StudioSessionMapping -> Value Text
sessionPolicyArn :: StudioSessionMapping -> Value Text
studioId :: StudioSessionMapping -> Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
= StudioSessionMapping {sessionPolicyArn :: Value Text
sessionPolicyArn = PropertyType "SessionPolicyArn" StudioSessionMapping
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
studioId :: Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
studioId :: Value Text
..}
instance Property "StudioId" StudioSessionMapping where
type PropertyType "StudioId" StudioSessionMapping = Value Prelude.Text
set :: PropertyType "StudioId" StudioSessionMapping
-> StudioSessionMapping -> StudioSessionMapping
set PropertyType "StudioId" StudioSessionMapping
newValue StudioSessionMapping {()
Value Text
haddock_workaround_ :: StudioSessionMapping -> ()
identityName :: StudioSessionMapping -> Value Text
identityType :: StudioSessionMapping -> Value Text
sessionPolicyArn :: StudioSessionMapping -> Value Text
studioId :: StudioSessionMapping -> Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
studioId :: Value Text
..}
= StudioSessionMapping {studioId :: Value Text
studioId = PropertyType "StudioId" StudioSessionMapping
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
haddock_workaround_ :: ()
identityName :: Value Text
identityType :: Value Text
sessionPolicyArn :: Value Text
..}