module Stratosphere.CodePipeline.Pipeline.StageTransitionProperty (
StageTransitionProperty(..), mkStageTransitionProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data StageTransitionProperty
=
StageTransitionProperty {StageTransitionProperty -> ()
haddock_workaround_ :: (),
StageTransitionProperty -> Value Text
reason :: (Value Prelude.Text),
StageTransitionProperty -> Value Text
stageName :: (Value Prelude.Text)}
deriving stock (StageTransitionProperty -> StageTransitionProperty -> Bool
(StageTransitionProperty -> StageTransitionProperty -> Bool)
-> (StageTransitionProperty -> StageTransitionProperty -> Bool)
-> Eq StageTransitionProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: StageTransitionProperty -> StageTransitionProperty -> Bool
== :: StageTransitionProperty -> StageTransitionProperty -> Bool
$c/= :: StageTransitionProperty -> StageTransitionProperty -> Bool
/= :: StageTransitionProperty -> StageTransitionProperty -> Bool
Prelude.Eq, Int -> StageTransitionProperty -> ShowS
[StageTransitionProperty] -> ShowS
StageTransitionProperty -> String
(Int -> StageTransitionProperty -> ShowS)
-> (StageTransitionProperty -> String)
-> ([StageTransitionProperty] -> ShowS)
-> Show StageTransitionProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> StageTransitionProperty -> ShowS
showsPrec :: Int -> StageTransitionProperty -> ShowS
$cshow :: StageTransitionProperty -> String
show :: StageTransitionProperty -> String
$cshowList :: [StageTransitionProperty] -> ShowS
showList :: [StageTransitionProperty] -> ShowS
Prelude.Show)
mkStageTransitionProperty ::
Value Prelude.Text -> Value Prelude.Text -> StageTransitionProperty
mkStageTransitionProperty :: Value Text -> Value Text -> StageTransitionProperty
mkStageTransitionProperty Value Text
reason Value Text
stageName
= StageTransitionProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), reason :: Value Text
reason = Value Text
reason, stageName :: Value Text
stageName = Value Text
stageName}
instance ToResourceProperties StageTransitionProperty where
toResourceProperties :: StageTransitionProperty -> ResourceProperties
toResourceProperties StageTransitionProperty {()
Value Text
haddock_workaround_ :: StageTransitionProperty -> ()
reason :: StageTransitionProperty -> Value Text
stageName :: StageTransitionProperty -> Value Text
haddock_workaround_ :: ()
reason :: Value Text
stageName :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::CodePipeline::Pipeline.StageTransition",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"Reason" 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
reason,
Key
"StageName" 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
stageName]}
instance JSON.ToJSON StageTransitionProperty where
toJSON :: StageTransitionProperty -> Value
toJSON StageTransitionProperty {()
Value Text
haddock_workaround_ :: StageTransitionProperty -> ()
reason :: StageTransitionProperty -> Value Text
stageName :: StageTransitionProperty -> Value Text
haddock_workaround_ :: ()
reason :: Value Text
stageName :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"Reason" 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
reason, Key
"StageName" 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
stageName]
instance Property "Reason" StageTransitionProperty where
type PropertyType "Reason" StageTransitionProperty = Value Prelude.Text
set :: PropertyType "Reason" StageTransitionProperty
-> StageTransitionProperty -> StageTransitionProperty
set PropertyType "Reason" StageTransitionProperty
newValue StageTransitionProperty {()
Value Text
haddock_workaround_ :: StageTransitionProperty -> ()
reason :: StageTransitionProperty -> Value Text
stageName :: StageTransitionProperty -> Value Text
haddock_workaround_ :: ()
reason :: Value Text
stageName :: Value Text
..}
= StageTransitionProperty {reason :: Value Text
reason = PropertyType "Reason" StageTransitionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
stageName :: Value Text
haddock_workaround_ :: ()
stageName :: Value Text
..}
instance Property "StageName" StageTransitionProperty where
type PropertyType "StageName" StageTransitionProperty = Value Prelude.Text
set :: PropertyType "StageName" StageTransitionProperty
-> StageTransitionProperty -> StageTransitionProperty
set PropertyType "StageName" StageTransitionProperty
newValue StageTransitionProperty {()
Value Text
haddock_workaround_ :: StageTransitionProperty -> ()
reason :: StageTransitionProperty -> Value Text
stageName :: StageTransitionProperty -> Value Text
haddock_workaround_ :: ()
reason :: Value Text
stageName :: Value Text
..}
= StageTransitionProperty {stageName :: Value Text
stageName = PropertyType "StageName" StageTransitionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
reason :: Value Text
haddock_workaround_ :: ()
reason :: Value Text
..}