module Stratosphere.BCMDataExports.Export.DestinationConfigurationsProperty (
module Exports, DestinationConfigurationsProperty(..),
mkDestinationConfigurationsProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.BCMDataExports.Export.S3DestinationProperty as Exports
import Stratosphere.ResourceProperties
data DestinationConfigurationsProperty
=
DestinationConfigurationsProperty {DestinationConfigurationsProperty -> ()
haddock_workaround_ :: (),
DestinationConfigurationsProperty -> S3DestinationProperty
s3Destination :: S3DestinationProperty}
deriving stock (DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool
(DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool)
-> (DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool)
-> Eq DestinationConfigurationsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool
== :: DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool
$c/= :: DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool
/= :: DestinationConfigurationsProperty
-> DestinationConfigurationsProperty -> Bool
Prelude.Eq, Int -> DestinationConfigurationsProperty -> ShowS
[DestinationConfigurationsProperty] -> ShowS
DestinationConfigurationsProperty -> String
(Int -> DestinationConfigurationsProperty -> ShowS)
-> (DestinationConfigurationsProperty -> String)
-> ([DestinationConfigurationsProperty] -> ShowS)
-> Show DestinationConfigurationsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DestinationConfigurationsProperty -> ShowS
showsPrec :: Int -> DestinationConfigurationsProperty -> ShowS
$cshow :: DestinationConfigurationsProperty -> String
show :: DestinationConfigurationsProperty -> String
$cshowList :: [DestinationConfigurationsProperty] -> ShowS
showList :: [DestinationConfigurationsProperty] -> ShowS
Prelude.Show)
mkDestinationConfigurationsProperty ::
S3DestinationProperty -> DestinationConfigurationsProperty
mkDestinationConfigurationsProperty :: S3DestinationProperty -> DestinationConfigurationsProperty
mkDestinationConfigurationsProperty S3DestinationProperty
s3Destination
= DestinationConfigurationsProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), s3Destination :: S3DestinationProperty
s3Destination = S3DestinationProperty
s3Destination}
instance ToResourceProperties DestinationConfigurationsProperty where
toResourceProperties :: DestinationConfigurationsProperty -> ResourceProperties
toResourceProperties DestinationConfigurationsProperty {()
S3DestinationProperty
haddock_workaround_ :: DestinationConfigurationsProperty -> ()
s3Destination :: DestinationConfigurationsProperty -> S3DestinationProperty
haddock_workaround_ :: ()
s3Destination :: S3DestinationProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::BCMDataExports::Export.DestinationConfigurations",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"S3Destination" Key -> S3DestinationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= S3DestinationProperty
s3Destination]}
instance JSON.ToJSON DestinationConfigurationsProperty where
toJSON :: DestinationConfigurationsProperty -> Value
toJSON DestinationConfigurationsProperty {()
S3DestinationProperty
haddock_workaround_ :: DestinationConfigurationsProperty -> ()
s3Destination :: DestinationConfigurationsProperty -> S3DestinationProperty
haddock_workaround_ :: ()
s3Destination :: S3DestinationProperty
..}
= [(Key, Value)] -> Value
JSON.object [Key
"S3Destination" Key -> S3DestinationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= S3DestinationProperty
s3Destination]
instance Property "S3Destination" DestinationConfigurationsProperty where
type PropertyType "S3Destination" DestinationConfigurationsProperty = S3DestinationProperty
set :: PropertyType "S3Destination" DestinationConfigurationsProperty
-> DestinationConfigurationsProperty
-> DestinationConfigurationsProperty
set PropertyType "S3Destination" DestinationConfigurationsProperty
newValue DestinationConfigurationsProperty {()
S3DestinationProperty
haddock_workaround_ :: DestinationConfigurationsProperty -> ()
s3Destination :: DestinationConfigurationsProperty -> S3DestinationProperty
haddock_workaround_ :: ()
s3Destination :: S3DestinationProperty
..}
= DestinationConfigurationsProperty {s3Destination :: S3DestinationProperty
s3Destination = PropertyType "S3Destination" DestinationConfigurationsProperty
S3DestinationProperty
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}