module Stratosphere.Resources.VPCGatewayAttachment where
import Control.Lens
import Data.Aeson
import Data.Aeson.Types
import Data.Text
import GHC.Generics
import Stratosphere.Values
data VPCGatewayAttachment =
VPCGatewayAttachment
{ _vPCGatewayAttachmentInternetGatewayId :: Maybe (Val Text)
, _vPCGatewayAttachmentVpcId :: Val Text
, _vPCGatewayAttachmentVpnGatewayId :: Maybe (Val Text)
} deriving (Show, Generic)
instance ToJSON VPCGatewayAttachment where
toJSON = genericToJSON defaultOptions { fieldLabelModifier = Prelude.drop 21, omitNothingFields = True }
instance FromJSON VPCGatewayAttachment where
parseJSON = genericParseJSON defaultOptions { fieldLabelModifier = Prelude.drop 21, omitNothingFields = True }
vpcGatewayAttachment
:: Val Text
-> VPCGatewayAttachment
vpcGatewayAttachment vpcIdarg =
VPCGatewayAttachment
{ _vPCGatewayAttachmentInternetGatewayId = Nothing
, _vPCGatewayAttachmentVpcId = vpcIdarg
, _vPCGatewayAttachmentVpnGatewayId = Nothing
}
vpcgaInternetGatewayId :: Lens' VPCGatewayAttachment (Maybe (Val Text))
vpcgaInternetGatewayId = lens _vPCGatewayAttachmentInternetGatewayId (\s a -> s { _vPCGatewayAttachmentInternetGatewayId = a })
vpcgaVpcId :: Lens' VPCGatewayAttachment (Val Text)
vpcgaVpcId = lens _vPCGatewayAttachmentVpcId (\s a -> s { _vPCGatewayAttachmentVpcId = a })
vpcgaVpnGatewayId :: Lens' VPCGatewayAttachment (Maybe (Val Text))
vpcgaVpnGatewayId = lens _vPCGatewayAttachmentVpnGatewayId (\s a -> s { _vPCGatewayAttachmentVpnGatewayId = a })