module Stratosphere.CloudFormation.TypeActivation (
module Exports, TypeActivation(..), mkTypeActivation
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.CloudFormation.TypeActivation.LoggingConfigProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data TypeActivation
=
TypeActivation {TypeActivation -> ()
haddock_workaround_ :: (),
TypeActivation -> Maybe (Value Bool)
autoUpdate :: (Prelude.Maybe (Value Prelude.Bool)),
TypeActivation -> Maybe (Value Text)
executionRoleArn :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe LoggingConfigProperty
loggingConfig :: (Prelude.Maybe LoggingConfigProperty),
TypeActivation -> Maybe (Value Text)
majorVersion :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe (Value Text)
publicTypeArn :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe (Value Text)
publisherId :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe (Value Text)
type' :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe (Value Text)
typeName :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe (Value Text)
typeNameAlias :: (Prelude.Maybe (Value Prelude.Text)),
TypeActivation -> Maybe (Value Text)
versionBump :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (TypeActivation -> TypeActivation -> Bool
(TypeActivation -> TypeActivation -> Bool)
-> (TypeActivation -> TypeActivation -> Bool) -> Eq TypeActivation
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TypeActivation -> TypeActivation -> Bool
== :: TypeActivation -> TypeActivation -> Bool
$c/= :: TypeActivation -> TypeActivation -> Bool
/= :: TypeActivation -> TypeActivation -> Bool
Prelude.Eq, Int -> TypeActivation -> ShowS
[TypeActivation] -> ShowS
TypeActivation -> String
(Int -> TypeActivation -> ShowS)
-> (TypeActivation -> String)
-> ([TypeActivation] -> ShowS)
-> Show TypeActivation
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TypeActivation -> ShowS
showsPrec :: Int -> TypeActivation -> ShowS
$cshow :: TypeActivation -> String
show :: TypeActivation -> String
$cshowList :: [TypeActivation] -> ShowS
showList :: [TypeActivation] -> ShowS
Prelude.Show)
mkTypeActivation :: TypeActivation
mkTypeActivation :: TypeActivation
mkTypeActivation
= TypeActivation
{haddock_workaround_ :: ()
haddock_workaround_ = (), autoUpdate :: Maybe (Value Bool)
autoUpdate = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
executionRoleArn :: Maybe (Value Text)
executionRoleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
loggingConfig :: Maybe LoggingConfigProperty
loggingConfig = Maybe LoggingConfigProperty
forall a. Maybe a
Prelude.Nothing, majorVersion :: Maybe (Value Text)
majorVersion = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
publicTypeArn :: Maybe (Value Text)
publicTypeArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, publisherId :: Maybe (Value Text)
publisherId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
type' :: Maybe (Value Text)
type' = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, typeName :: Maybe (Value Text)
typeName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
typeNameAlias :: Maybe (Value Text)
typeNameAlias = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, versionBump :: Maybe (Value Text)
versionBump = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties TypeActivation where
toResourceProperties :: TypeActivation -> ResourceProperties
toResourceProperties TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::CloudFormation::TypeActivation",
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 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
"AutoUpdate" (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)
autoUpdate,
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
"ExecutionRoleArn" (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)
executionRoleArn,
Key -> LoggingConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LoggingConfig" (LoggingConfigProperty -> (Key, Value))
-> Maybe LoggingConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LoggingConfigProperty
loggingConfig,
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
"MajorVersion" (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)
majorVersion,
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
"PublicTypeArn" (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)
publicTypeArn,
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
"PublisherId" (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)
publisherId,
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
"Type" (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)
type',
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
"TypeName" (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)
typeName,
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
"TypeNameAlias" (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)
typeNameAlias,
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
"VersionBump" (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)
versionBump])}
instance JSON.ToJSON TypeActivation where
toJSON :: TypeActivation -> Value
toJSON TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= [(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 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
"AutoUpdate" (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)
autoUpdate,
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
"ExecutionRoleArn" (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)
executionRoleArn,
Key -> LoggingConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LoggingConfig" (LoggingConfigProperty -> (Key, Value))
-> Maybe LoggingConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LoggingConfigProperty
loggingConfig,
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
"MajorVersion" (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)
majorVersion,
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
"PublicTypeArn" (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)
publicTypeArn,
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
"PublisherId" (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)
publisherId,
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
"Type" (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)
type',
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
"TypeName" (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)
typeName,
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
"TypeNameAlias" (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)
typeNameAlias,
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
"VersionBump" (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)
versionBump]))
instance Property "AutoUpdate" TypeActivation where
type PropertyType "AutoUpdate" TypeActivation = Value Prelude.Bool
set :: PropertyType "AutoUpdate" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "AutoUpdate" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {autoUpdate :: Maybe (Value Bool)
autoUpdate = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AutoUpdate" TypeActivation
Value Bool
newValue, Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "ExecutionRoleArn" TypeActivation where
type PropertyType "ExecutionRoleArn" TypeActivation = Value Prelude.Text
set :: PropertyType "ExecutionRoleArn" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "ExecutionRoleArn" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {executionRoleArn :: Maybe (Value Text)
executionRoleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ExecutionRoleArn" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "LoggingConfig" TypeActivation where
type PropertyType "LoggingConfig" TypeActivation = LoggingConfigProperty
set :: PropertyType "LoggingConfig" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "LoggingConfig" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {loggingConfig :: Maybe LoggingConfigProperty
loggingConfig = LoggingConfigProperty -> Maybe LoggingConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LoggingConfig" TypeActivation
LoggingConfigProperty
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "MajorVersion" TypeActivation where
type PropertyType "MajorVersion" TypeActivation = Value Prelude.Text
set :: PropertyType "MajorVersion" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "MajorVersion" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {majorVersion :: Maybe (Value Text)
majorVersion = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MajorVersion" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "PublicTypeArn" TypeActivation where
type PropertyType "PublicTypeArn" TypeActivation = Value Prelude.Text
set :: PropertyType "PublicTypeArn" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "PublicTypeArn" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {publicTypeArn :: Maybe (Value Text)
publicTypeArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PublicTypeArn" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "PublisherId" TypeActivation where
type PropertyType "PublisherId" TypeActivation = Value Prelude.Text
set :: PropertyType "PublisherId" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "PublisherId" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {publisherId :: Maybe (Value Text)
publisherId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PublisherId" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "Type" TypeActivation where
type PropertyType "Type" TypeActivation = Value Prelude.Text
set :: PropertyType "Type" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "Type" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {type' :: Maybe (Value Text)
type' = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Type" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "TypeName" TypeActivation where
type PropertyType "TypeName" TypeActivation = Value Prelude.Text
set :: PropertyType "TypeName" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "TypeName" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {typeName :: Maybe (Value Text)
typeName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TypeName" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "TypeNameAlias" TypeActivation where
type PropertyType "TypeNameAlias" TypeActivation = Value Prelude.Text
set :: PropertyType "TypeNameAlias" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "TypeNameAlias" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {typeNameAlias :: Maybe (Value Text)
typeNameAlias = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TypeNameAlias" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
instance Property "VersionBump" TypeActivation where
type PropertyType "VersionBump" TypeActivation = Value Prelude.Text
set :: PropertyType "VersionBump" TypeActivation
-> TypeActivation -> TypeActivation
set PropertyType "VersionBump" TypeActivation
newValue TypeActivation {Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: TypeActivation -> ()
autoUpdate :: TypeActivation -> Maybe (Value Bool)
executionRoleArn :: TypeActivation -> Maybe (Value Text)
loggingConfig :: TypeActivation -> Maybe LoggingConfigProperty
majorVersion :: TypeActivation -> Maybe (Value Text)
publicTypeArn :: TypeActivation -> Maybe (Value Text)
publisherId :: TypeActivation -> Maybe (Value Text)
type' :: TypeActivation -> Maybe (Value Text)
typeName :: TypeActivation -> Maybe (Value Text)
typeNameAlias :: TypeActivation -> Maybe (Value Text)
versionBump :: TypeActivation -> Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
versionBump :: Maybe (Value Text)
..}
= TypeActivation {versionBump :: Maybe (Value Text)
versionBump = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "VersionBump" TypeActivation
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
Maybe LoggingConfigProperty
()
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
haddock_workaround_ :: ()
autoUpdate :: Maybe (Value Bool)
executionRoleArn :: Maybe (Value Text)
loggingConfig :: Maybe LoggingConfigProperty
majorVersion :: Maybe (Value Text)
publicTypeArn :: Maybe (Value Text)
publisherId :: Maybe (Value Text)
type' :: Maybe (Value Text)
typeName :: Maybe (Value Text)
typeNameAlias :: Maybe (Value Text)
..}