module Stratosphere.MSK.Cluster.VpcConnectivitySaslProperty (
module Exports, VpcConnectivitySaslProperty(..),
mkVpcConnectivitySaslProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.MSK.Cluster.VpcConnectivityIamProperty as Exports
import {-# SOURCE #-} Stratosphere.MSK.Cluster.VpcConnectivityScramProperty as Exports
import Stratosphere.ResourceProperties
data VpcConnectivitySaslProperty
=
VpcConnectivitySaslProperty {VpcConnectivitySaslProperty -> ()
haddock_workaround_ :: (),
VpcConnectivitySaslProperty -> Maybe VpcConnectivityIamProperty
iam :: (Prelude.Maybe VpcConnectivityIamProperty),
VpcConnectivitySaslProperty -> Maybe VpcConnectivityScramProperty
scram :: (Prelude.Maybe VpcConnectivityScramProperty)}
deriving stock (VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty -> Bool
(VpcConnectivitySaslProperty
-> VpcConnectivitySaslProperty -> Bool)
-> (VpcConnectivitySaslProperty
-> VpcConnectivitySaslProperty -> Bool)
-> Eq VpcConnectivitySaslProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty -> Bool
== :: VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty -> Bool
$c/= :: VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty -> Bool
/= :: VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty -> Bool
Prelude.Eq, Int -> VpcConnectivitySaslProperty -> ShowS
[VpcConnectivitySaslProperty] -> ShowS
VpcConnectivitySaslProperty -> String
(Int -> VpcConnectivitySaslProperty -> ShowS)
-> (VpcConnectivitySaslProperty -> String)
-> ([VpcConnectivitySaslProperty] -> ShowS)
-> Show VpcConnectivitySaslProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> VpcConnectivitySaslProperty -> ShowS
showsPrec :: Int -> VpcConnectivitySaslProperty -> ShowS
$cshow :: VpcConnectivitySaslProperty -> String
show :: VpcConnectivitySaslProperty -> String
$cshowList :: [VpcConnectivitySaslProperty] -> ShowS
showList :: [VpcConnectivitySaslProperty] -> ShowS
Prelude.Show)
mkVpcConnectivitySaslProperty :: VpcConnectivitySaslProperty
mkVpcConnectivitySaslProperty :: VpcConnectivitySaslProperty
mkVpcConnectivitySaslProperty
= VpcConnectivitySaslProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), iam :: Maybe VpcConnectivityIamProperty
iam = Maybe VpcConnectivityIamProperty
forall a. Maybe a
Prelude.Nothing,
scram :: Maybe VpcConnectivityScramProperty
scram = Maybe VpcConnectivityScramProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties VpcConnectivitySaslProperty where
toResourceProperties :: VpcConnectivitySaslProperty -> ResourceProperties
toResourceProperties VpcConnectivitySaslProperty {Maybe VpcConnectivityIamProperty
Maybe VpcConnectivityScramProperty
()
haddock_workaround_ :: VpcConnectivitySaslProperty -> ()
iam :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityIamProperty
scram :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityScramProperty
haddock_workaround_ :: ()
iam :: Maybe VpcConnectivityIamProperty
scram :: Maybe VpcConnectivityScramProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::MSK::Cluster.VpcConnectivitySasl",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> VpcConnectivityIamProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Iam" (VpcConnectivityIamProperty -> (Key, Value))
-> Maybe VpcConnectivityIamProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VpcConnectivityIamProperty
iam,
Key -> VpcConnectivityScramProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Scram" (VpcConnectivityScramProperty -> (Key, Value))
-> Maybe VpcConnectivityScramProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VpcConnectivityScramProperty
scram])}
instance JSON.ToJSON VpcConnectivitySaslProperty where
toJSON :: VpcConnectivitySaslProperty -> Value
toJSON VpcConnectivitySaslProperty {Maybe VpcConnectivityIamProperty
Maybe VpcConnectivityScramProperty
()
haddock_workaround_ :: VpcConnectivitySaslProperty -> ()
iam :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityIamProperty
scram :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityScramProperty
haddock_workaround_ :: ()
iam :: Maybe VpcConnectivityIamProperty
scram :: Maybe VpcConnectivityScramProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> VpcConnectivityIamProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Iam" (VpcConnectivityIamProperty -> (Key, Value))
-> Maybe VpcConnectivityIamProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VpcConnectivityIamProperty
iam,
Key -> VpcConnectivityScramProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Scram" (VpcConnectivityScramProperty -> (Key, Value))
-> Maybe VpcConnectivityScramProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VpcConnectivityScramProperty
scram]))
instance Property "Iam" VpcConnectivitySaslProperty where
type PropertyType "Iam" VpcConnectivitySaslProperty = VpcConnectivityIamProperty
set :: PropertyType "Iam" VpcConnectivitySaslProperty
-> VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty
set PropertyType "Iam" VpcConnectivitySaslProperty
newValue VpcConnectivitySaslProperty {Maybe VpcConnectivityIamProperty
Maybe VpcConnectivityScramProperty
()
haddock_workaround_ :: VpcConnectivitySaslProperty -> ()
iam :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityIamProperty
scram :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityScramProperty
haddock_workaround_ :: ()
iam :: Maybe VpcConnectivityIamProperty
scram :: Maybe VpcConnectivityScramProperty
..}
= VpcConnectivitySaslProperty {iam :: Maybe VpcConnectivityIamProperty
iam = VpcConnectivityIamProperty -> Maybe VpcConnectivityIamProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Iam" VpcConnectivitySaslProperty
VpcConnectivityIamProperty
newValue, Maybe VpcConnectivityScramProperty
()
haddock_workaround_ :: ()
scram :: Maybe VpcConnectivityScramProperty
haddock_workaround_ :: ()
scram :: Maybe VpcConnectivityScramProperty
..}
instance Property "Scram" VpcConnectivitySaslProperty where
type PropertyType "Scram" VpcConnectivitySaslProperty = VpcConnectivityScramProperty
set :: PropertyType "Scram" VpcConnectivitySaslProperty
-> VpcConnectivitySaslProperty -> VpcConnectivitySaslProperty
set PropertyType "Scram" VpcConnectivitySaslProperty
newValue VpcConnectivitySaslProperty {Maybe VpcConnectivityIamProperty
Maybe VpcConnectivityScramProperty
()
haddock_workaround_ :: VpcConnectivitySaslProperty -> ()
iam :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityIamProperty
scram :: VpcConnectivitySaslProperty -> Maybe VpcConnectivityScramProperty
haddock_workaround_ :: ()
iam :: Maybe VpcConnectivityIamProperty
scram :: Maybe VpcConnectivityScramProperty
..}
= VpcConnectivitySaslProperty {scram :: Maybe VpcConnectivityScramProperty
scram = VpcConnectivityScramProperty -> Maybe VpcConnectivityScramProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Scram" VpcConnectivitySaslProperty
VpcConnectivityScramProperty
newValue, Maybe VpcConnectivityIamProperty
()
haddock_workaround_ :: ()
iam :: Maybe VpcConnectivityIamProperty
haddock_workaround_ :: ()
iam :: Maybe VpcConnectivityIamProperty
..}