module Stratosphere.KafkaConnect.Connector.VpcProperty (
VpcProperty(..), mkVpcProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data VpcProperty
=
VpcProperty {VpcProperty -> ()
haddock_workaround_ :: (),
VpcProperty -> ValueList Text
securityGroups :: (ValueList Prelude.Text),
VpcProperty -> ValueList Text
subnets :: (ValueList Prelude.Text)}
deriving stock (VpcProperty -> VpcProperty -> Bool
(VpcProperty -> VpcProperty -> Bool)
-> (VpcProperty -> VpcProperty -> Bool) -> Eq VpcProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: VpcProperty -> VpcProperty -> Bool
== :: VpcProperty -> VpcProperty -> Bool
$c/= :: VpcProperty -> VpcProperty -> Bool
/= :: VpcProperty -> VpcProperty -> Bool
Prelude.Eq, Int -> VpcProperty -> ShowS
[VpcProperty] -> ShowS
VpcProperty -> String
(Int -> VpcProperty -> ShowS)
-> (VpcProperty -> String)
-> ([VpcProperty] -> ShowS)
-> Show VpcProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> VpcProperty -> ShowS
showsPrec :: Int -> VpcProperty -> ShowS
$cshow :: VpcProperty -> String
show :: VpcProperty -> String
$cshowList :: [VpcProperty] -> ShowS
showList :: [VpcProperty] -> ShowS
Prelude.Show)
mkVpcProperty ::
ValueList Prelude.Text -> ValueList Prelude.Text -> VpcProperty
mkVpcProperty :: ValueList Text -> ValueList Text -> VpcProperty
mkVpcProperty ValueList Text
securityGroups ValueList Text
subnets
= VpcProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), securityGroups :: ValueList Text
securityGroups = ValueList Text
securityGroups,
subnets :: ValueList Text
subnets = ValueList Text
subnets}
instance ToResourceProperties VpcProperty where
toResourceProperties :: VpcProperty -> ResourceProperties
toResourceProperties VpcProperty {()
ValueList Text
haddock_workaround_ :: VpcProperty -> ()
securityGroups :: VpcProperty -> ValueList Text
subnets :: VpcProperty -> ValueList Text
haddock_workaround_ :: ()
securityGroups :: ValueList Text
subnets :: ValueList Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::KafkaConnect::Connector.Vpc",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"SecurityGroups" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
securityGroups,
Key
"Subnets" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
subnets]}
instance JSON.ToJSON VpcProperty where
toJSON :: VpcProperty -> Value
toJSON VpcProperty {()
ValueList Text
haddock_workaround_ :: VpcProperty -> ()
securityGroups :: VpcProperty -> ValueList Text
subnets :: VpcProperty -> ValueList Text
haddock_workaround_ :: ()
securityGroups :: ValueList Text
subnets :: ValueList Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"SecurityGroups" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
securityGroups,
Key
"Subnets" Key -> ValueList Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ValueList Text
subnets]
instance Property "SecurityGroups" VpcProperty where
type PropertyType "SecurityGroups" VpcProperty = ValueList Prelude.Text
set :: PropertyType "SecurityGroups" VpcProperty
-> VpcProperty -> VpcProperty
set PropertyType "SecurityGroups" VpcProperty
newValue VpcProperty {()
ValueList Text
haddock_workaround_ :: VpcProperty -> ()
securityGroups :: VpcProperty -> ValueList Text
subnets :: VpcProperty -> ValueList Text
haddock_workaround_ :: ()
securityGroups :: ValueList Text
subnets :: ValueList Text
..}
= VpcProperty {securityGroups :: ValueList Text
securityGroups = PropertyType "SecurityGroups" VpcProperty
ValueList Text
newValue, ()
ValueList Text
haddock_workaround_ :: ()
subnets :: ValueList Text
haddock_workaround_ :: ()
subnets :: ValueList Text
..}
instance Property "Subnets" VpcProperty where
type PropertyType "Subnets" VpcProperty = ValueList Prelude.Text
set :: PropertyType "Subnets" VpcProperty -> VpcProperty -> VpcProperty
set PropertyType "Subnets" VpcProperty
newValue VpcProperty {()
ValueList Text
haddock_workaround_ :: VpcProperty -> ()
securityGroups :: VpcProperty -> ValueList Text
subnets :: VpcProperty -> ValueList Text
haddock_workaround_ :: ()
securityGroups :: ValueList Text
subnets :: ValueList Text
..}
= VpcProperty {subnets :: ValueList Text
subnets = PropertyType "Subnets" VpcProperty
ValueList Text
newValue, ()
ValueList Text
haddock_workaround_ :: ()
securityGroups :: ValueList Text
haddock_workaround_ :: ()
securityGroups :: ValueList Text
..}