module Stratosphere.ECR.ReplicationConfiguration.ReplicationDestinationProperty (
ReplicationDestinationProperty(..),
mkReplicationDestinationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ReplicationDestinationProperty
=
ReplicationDestinationProperty {ReplicationDestinationProperty -> ()
haddock_workaround_ :: (),
ReplicationDestinationProperty -> Value Text
region :: (Value Prelude.Text),
ReplicationDestinationProperty -> Value Text
registryId :: (Value Prelude.Text)}
deriving stock (ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool
(ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool)
-> (ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool)
-> Eq ReplicationDestinationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool
== :: ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool
$c/= :: ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool
/= :: ReplicationDestinationProperty
-> ReplicationDestinationProperty -> Bool
Prelude.Eq, Int -> ReplicationDestinationProperty -> ShowS
[ReplicationDestinationProperty] -> ShowS
ReplicationDestinationProperty -> String
(Int -> ReplicationDestinationProperty -> ShowS)
-> (ReplicationDestinationProperty -> String)
-> ([ReplicationDestinationProperty] -> ShowS)
-> Show ReplicationDestinationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ReplicationDestinationProperty -> ShowS
showsPrec :: Int -> ReplicationDestinationProperty -> ShowS
$cshow :: ReplicationDestinationProperty -> String
show :: ReplicationDestinationProperty -> String
$cshowList :: [ReplicationDestinationProperty] -> ShowS
showList :: [ReplicationDestinationProperty] -> ShowS
Prelude.Show)
mkReplicationDestinationProperty ::
Value Prelude.Text
-> Value Prelude.Text -> ReplicationDestinationProperty
mkReplicationDestinationProperty :: Value Text -> Value Text -> ReplicationDestinationProperty
mkReplicationDestinationProperty Value Text
region Value Text
registryId
= ReplicationDestinationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), region :: Value Text
region = Value Text
region,
registryId :: Value Text
registryId = Value Text
registryId}
instance ToResourceProperties ReplicationDestinationProperty where
toResourceProperties :: ReplicationDestinationProperty -> ResourceProperties
toResourceProperties ReplicationDestinationProperty {()
Value Text
haddock_workaround_ :: ReplicationDestinationProperty -> ()
region :: ReplicationDestinationProperty -> Value Text
registryId :: ReplicationDestinationProperty -> Value Text
haddock_workaround_ :: ()
region :: Value Text
registryId :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::ECR::ReplicationConfiguration.ReplicationDestination",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"Region" 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
region,
Key
"RegistryId" 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
registryId]}
instance JSON.ToJSON ReplicationDestinationProperty where
toJSON :: ReplicationDestinationProperty -> Value
toJSON ReplicationDestinationProperty {()
Value Text
haddock_workaround_ :: ReplicationDestinationProperty -> ()
region :: ReplicationDestinationProperty -> Value Text
registryId :: ReplicationDestinationProperty -> Value Text
haddock_workaround_ :: ()
region :: Value Text
registryId :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"Region" 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
region, Key
"RegistryId" 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
registryId]
instance Property "Region" ReplicationDestinationProperty where
type PropertyType "Region" ReplicationDestinationProperty = Value Prelude.Text
set :: PropertyType "Region" ReplicationDestinationProperty
-> ReplicationDestinationProperty -> ReplicationDestinationProperty
set PropertyType "Region" ReplicationDestinationProperty
newValue ReplicationDestinationProperty {()
Value Text
haddock_workaround_ :: ReplicationDestinationProperty -> ()
region :: ReplicationDestinationProperty -> Value Text
registryId :: ReplicationDestinationProperty -> Value Text
haddock_workaround_ :: ()
region :: Value Text
registryId :: Value Text
..}
= ReplicationDestinationProperty {region :: Value Text
region = PropertyType "Region" ReplicationDestinationProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
registryId :: Value Text
haddock_workaround_ :: ()
registryId :: Value Text
..}
instance Property "RegistryId" ReplicationDestinationProperty where
type PropertyType "RegistryId" ReplicationDestinationProperty = Value Prelude.Text
set :: PropertyType "RegistryId" ReplicationDestinationProperty
-> ReplicationDestinationProperty -> ReplicationDestinationProperty
set PropertyType "RegistryId" ReplicationDestinationProperty
newValue ReplicationDestinationProperty {()
Value Text
haddock_workaround_ :: ReplicationDestinationProperty -> ()
region :: ReplicationDestinationProperty -> Value Text
registryId :: ReplicationDestinationProperty -> Value Text
haddock_workaround_ :: ()
region :: Value Text
registryId :: Value Text
..}
= ReplicationDestinationProperty {registryId :: Value Text
registryId = PropertyType "RegistryId" ReplicationDestinationProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
region :: Value Text
haddock_workaround_ :: ()
region :: Value Text
..}