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