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