module Stratosphere.EC2.TransitGatewayRouteTablePropagation (
        TransitGatewayRouteTablePropagation(..),
        mkTransitGatewayRouteTablePropagation
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data TransitGatewayRouteTablePropagation
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-ec2-transitgatewayroutetablepropagation.html>
    TransitGatewayRouteTablePropagation {TransitGatewayRouteTablePropagation -> ()
haddock_workaround_ :: (),
                                         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-ec2-transitgatewayroutetablepropagation.html#cfn-ec2-transitgatewayroutetablepropagation-transitgatewayattachmentid>
                                         TransitGatewayRouteTablePropagation -> Value Text
transitGatewayAttachmentId :: (Value Prelude.Text),
                                         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-ec2-transitgatewayroutetablepropagation.html#cfn-ec2-transitgatewayroutetablepropagation-transitgatewayroutetableid>
                                         TransitGatewayRouteTablePropagation -> Value Text
transitGatewayRouteTableId :: (Value Prelude.Text)}
  deriving stock (TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation -> Bool
(TransitGatewayRouteTablePropagation
 -> TransitGatewayRouteTablePropagation -> Bool)
-> (TransitGatewayRouteTablePropagation
    -> TransitGatewayRouteTablePropagation -> Bool)
-> Eq TransitGatewayRouteTablePropagation
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation -> Bool
== :: TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation -> Bool
$c/= :: TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation -> Bool
/= :: TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation -> Bool
Prelude.Eq, Int -> TransitGatewayRouteTablePropagation -> ShowS
[TransitGatewayRouteTablePropagation] -> ShowS
TransitGatewayRouteTablePropagation -> String
(Int -> TransitGatewayRouteTablePropagation -> ShowS)
-> (TransitGatewayRouteTablePropagation -> String)
-> ([TransitGatewayRouteTablePropagation] -> ShowS)
-> Show TransitGatewayRouteTablePropagation
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TransitGatewayRouteTablePropagation -> ShowS
showsPrec :: Int -> TransitGatewayRouteTablePropagation -> ShowS
$cshow :: TransitGatewayRouteTablePropagation -> String
show :: TransitGatewayRouteTablePropagation -> String
$cshowList :: [TransitGatewayRouteTablePropagation] -> ShowS
showList :: [TransitGatewayRouteTablePropagation] -> ShowS
Prelude.Show)
mkTransitGatewayRouteTablePropagation ::
  Value Prelude.Text
  -> Value Prelude.Text -> TransitGatewayRouteTablePropagation
mkTransitGatewayRouteTablePropagation :: Value Text -> Value Text -> TransitGatewayRouteTablePropagation
mkTransitGatewayRouteTablePropagation
  Value Text
transitGatewayAttachmentId
  Value Text
transitGatewayRouteTableId
  = TransitGatewayRouteTablePropagation
      {haddock_workaround_ :: ()
haddock_workaround_ = (),
       transitGatewayAttachmentId :: Value Text
transitGatewayAttachmentId = Value Text
transitGatewayAttachmentId,
       transitGatewayRouteTableId :: Value Text
transitGatewayRouteTableId = Value Text
transitGatewayRouteTableId}
instance ToResourceProperties TransitGatewayRouteTablePropagation where
  toResourceProperties :: TransitGatewayRouteTablePropagation -> ResourceProperties
toResourceProperties TransitGatewayRouteTablePropagation {()
Value Text
haddock_workaround_ :: TransitGatewayRouteTablePropagation -> ()
transitGatewayAttachmentId :: TransitGatewayRouteTablePropagation -> Value Text
transitGatewayRouteTableId :: TransitGatewayRouteTablePropagation -> Value Text
haddock_workaround_ :: ()
transitGatewayAttachmentId :: Value Text
transitGatewayRouteTableId :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::EC2::TransitGatewayRouteTablePropagation",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"TransitGatewayAttachmentId"
                         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
transitGatewayAttachmentId,
                       Key
"TransitGatewayRouteTableId" 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
transitGatewayRouteTableId]}
instance JSON.ToJSON TransitGatewayRouteTablePropagation where
  toJSON :: TransitGatewayRouteTablePropagation -> Value
toJSON TransitGatewayRouteTablePropagation {()
Value Text
haddock_workaround_ :: TransitGatewayRouteTablePropagation -> ()
transitGatewayAttachmentId :: TransitGatewayRouteTablePropagation -> Value Text
transitGatewayRouteTableId :: TransitGatewayRouteTablePropagation -> Value Text
haddock_workaround_ :: ()
transitGatewayAttachmentId :: Value Text
transitGatewayRouteTableId :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"TransitGatewayAttachmentId" 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
transitGatewayAttachmentId,
         Key
"TransitGatewayRouteTableId" 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
transitGatewayRouteTableId]
instance Property "TransitGatewayAttachmentId" TransitGatewayRouteTablePropagation where
  type PropertyType "TransitGatewayAttachmentId" TransitGatewayRouteTablePropagation = Value Prelude.Text
  set :: PropertyType
  "TransitGatewayAttachmentId" TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation
set PropertyType
  "TransitGatewayAttachmentId" TransitGatewayRouteTablePropagation
newValue TransitGatewayRouteTablePropagation {()
Value Text
haddock_workaround_ :: TransitGatewayRouteTablePropagation -> ()
transitGatewayAttachmentId :: TransitGatewayRouteTablePropagation -> Value Text
transitGatewayRouteTableId :: TransitGatewayRouteTablePropagation -> Value Text
haddock_workaround_ :: ()
transitGatewayAttachmentId :: Value Text
transitGatewayRouteTableId :: Value Text
..}
    = TransitGatewayRouteTablePropagation
        {transitGatewayAttachmentId :: Value Text
transitGatewayAttachmentId = PropertyType
  "TransitGatewayAttachmentId" TransitGatewayRouteTablePropagation
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
transitGatewayRouteTableId :: Value Text
haddock_workaround_ :: ()
transitGatewayRouteTableId :: Value Text
..}
instance Property "TransitGatewayRouteTableId" TransitGatewayRouteTablePropagation where
  type PropertyType "TransitGatewayRouteTableId" TransitGatewayRouteTablePropagation = Value Prelude.Text
  set :: PropertyType
  "TransitGatewayRouteTableId" TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation
-> TransitGatewayRouteTablePropagation
set PropertyType
  "TransitGatewayRouteTableId" TransitGatewayRouteTablePropagation
newValue TransitGatewayRouteTablePropagation {()
Value Text
haddock_workaround_ :: TransitGatewayRouteTablePropagation -> ()
transitGatewayAttachmentId :: TransitGatewayRouteTablePropagation -> Value Text
transitGatewayRouteTableId :: TransitGatewayRouteTablePropagation -> Value Text
haddock_workaround_ :: ()
transitGatewayAttachmentId :: Value Text
transitGatewayRouteTableId :: Value Text
..}
    = TransitGatewayRouteTablePropagation
        {transitGatewayRouteTableId :: Value Text
transitGatewayRouteTableId = PropertyType
  "TransitGatewayRouteTableId" TransitGatewayRouteTablePropagation
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
transitGatewayAttachmentId :: Value Text
haddock_workaround_ :: ()
transitGatewayAttachmentId :: Value Text
..}