module Stratosphere.CloudFormation.StackSet.ParameterProperty (
ParameterProperty(..), mkParameterProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ParameterProperty
=
ParameterProperty {ParameterProperty -> ()
haddock_workaround_ :: (),
ParameterProperty -> Value Text
parameterKey :: (Value Prelude.Text),
ParameterProperty -> Value Text
parameterValue :: (Value Prelude.Text)}
deriving stock (ParameterProperty -> ParameterProperty -> Bool
(ParameterProperty -> ParameterProperty -> Bool)
-> (ParameterProperty -> ParameterProperty -> Bool)
-> Eq ParameterProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ParameterProperty -> ParameterProperty -> Bool
== :: ParameterProperty -> ParameterProperty -> Bool
$c/= :: ParameterProperty -> ParameterProperty -> Bool
/= :: ParameterProperty -> ParameterProperty -> Bool
Prelude.Eq, Int -> ParameterProperty -> ShowS
[ParameterProperty] -> ShowS
ParameterProperty -> String
(Int -> ParameterProperty -> ShowS)
-> (ParameterProperty -> String)
-> ([ParameterProperty] -> ShowS)
-> Show ParameterProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ParameterProperty -> ShowS
showsPrec :: Int -> ParameterProperty -> ShowS
$cshow :: ParameterProperty -> String
show :: ParameterProperty -> String
$cshowList :: [ParameterProperty] -> ShowS
showList :: [ParameterProperty] -> ShowS
Prelude.Show)
mkParameterProperty ::
Value Prelude.Text -> Value Prelude.Text -> ParameterProperty
mkParameterProperty :: Value Text -> Value Text -> ParameterProperty
mkParameterProperty Value Text
parameterKey Value Text
parameterValue
= ParameterProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), parameterKey :: Value Text
parameterKey = Value Text
parameterKey,
parameterValue :: Value Text
parameterValue = Value Text
parameterValue}
instance ToResourceProperties ParameterProperty where
toResourceProperties :: ParameterProperty -> ResourceProperties
toResourceProperties ParameterProperty {()
Value Text
haddock_workaround_ :: ParameterProperty -> ()
parameterKey :: ParameterProperty -> Value Text
parameterValue :: ParameterProperty -> Value Text
haddock_workaround_ :: ()
parameterKey :: Value Text
parameterValue :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::CloudFormation::StackSet.Parameter",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"ParameterKey" 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
parameterKey,
Key
"ParameterValue" 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
parameterValue]}
instance JSON.ToJSON ParameterProperty where
toJSON :: ParameterProperty -> Value
toJSON ParameterProperty {()
Value Text
haddock_workaround_ :: ParameterProperty -> ()
parameterKey :: ParameterProperty -> Value Text
parameterValue :: ParameterProperty -> Value Text
haddock_workaround_ :: ()
parameterKey :: Value Text
parameterValue :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"ParameterKey" 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
parameterKey,
Key
"ParameterValue" 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
parameterValue]
instance Property "ParameterKey" ParameterProperty where
type PropertyType "ParameterKey" ParameterProperty = Value Prelude.Text
set :: PropertyType "ParameterKey" ParameterProperty
-> ParameterProperty -> ParameterProperty
set PropertyType "ParameterKey" ParameterProperty
newValue ParameterProperty {()
Value Text
haddock_workaround_ :: ParameterProperty -> ()
parameterKey :: ParameterProperty -> Value Text
parameterValue :: ParameterProperty -> Value Text
haddock_workaround_ :: ()
parameterKey :: Value Text
parameterValue :: Value Text
..}
= ParameterProperty {parameterKey :: Value Text
parameterKey = PropertyType "ParameterKey" ParameterProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
parameterValue :: Value Text
haddock_workaround_ :: ()
parameterValue :: Value Text
..}
instance Property "ParameterValue" ParameterProperty where
type PropertyType "ParameterValue" ParameterProperty = Value Prelude.Text
set :: PropertyType "ParameterValue" ParameterProperty
-> ParameterProperty -> ParameterProperty
set PropertyType "ParameterValue" ParameterProperty
newValue ParameterProperty {()
Value Text
haddock_workaround_ :: ParameterProperty -> ()
parameterKey :: ParameterProperty -> Value Text
parameterValue :: ParameterProperty -> Value Text
haddock_workaround_ :: ()
parameterKey :: Value Text
parameterValue :: Value Text
..}
= ParameterProperty {parameterValue :: Value Text
parameterValue = PropertyType "ParameterValue" ParameterProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
parameterKey :: Value Text
haddock_workaround_ :: ()
parameterKey :: Value Text
..}