module Stratosphere.SES.MailManagerTrafficPolicy.IngressIsInAddressListProperty (
        IngressIsInAddressListProperty(..),
        mkIngressIsInAddressListProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data IngressIsInAddressListProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-ses-mailmanagertrafficpolicy-ingressisinaddresslist.html>
    IngressIsInAddressListProperty {IngressIsInAddressListProperty -> ()
haddock_workaround_ :: (),
                                    -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-ses-mailmanagertrafficpolicy-ingressisinaddresslist.html#cfn-ses-mailmanagertrafficpolicy-ingressisinaddresslist-addresslists>
                                    IngressIsInAddressListProperty -> ValueList Text
addressLists :: (ValueList Prelude.Text),
                                    -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-ses-mailmanagertrafficpolicy-ingressisinaddresslist.html#cfn-ses-mailmanagertrafficpolicy-ingressisinaddresslist-attribute>
                                    IngressIsInAddressListProperty -> Value Text
attribute :: (Value Prelude.Text)}
  deriving stock (IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> Bool
(IngressIsInAddressListProperty
 -> IngressIsInAddressListProperty -> Bool)
-> (IngressIsInAddressListProperty
    -> IngressIsInAddressListProperty -> Bool)
-> Eq IngressIsInAddressListProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> Bool
== :: IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> Bool
$c/= :: IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> Bool
/= :: IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> Bool
Prelude.Eq, Int -> IngressIsInAddressListProperty -> ShowS
[IngressIsInAddressListProperty] -> ShowS
IngressIsInAddressListProperty -> String
(Int -> IngressIsInAddressListProperty -> ShowS)
-> (IngressIsInAddressListProperty -> String)
-> ([IngressIsInAddressListProperty] -> ShowS)
-> Show IngressIsInAddressListProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> IngressIsInAddressListProperty -> ShowS
showsPrec :: Int -> IngressIsInAddressListProperty -> ShowS
$cshow :: IngressIsInAddressListProperty -> String
show :: IngressIsInAddressListProperty -> String
$cshowList :: [IngressIsInAddressListProperty] -> ShowS
showList :: [IngressIsInAddressListProperty] -> ShowS
Prelude.Show)
mkIngressIsInAddressListProperty ::
  ValueList Prelude.Text
  -> Value Prelude.Text -> IngressIsInAddressListProperty
mkIngressIsInAddressListProperty :: ValueList Text -> Value Text -> IngressIsInAddressListProperty
mkIngressIsInAddressListProperty ValueList Text
addressLists Value Text
attribute
  = IngressIsInAddressListProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), addressLists :: ValueList Text
addressLists = ValueList Text
addressLists,
       attribute :: Value Text
attribute = Value Text
attribute}
instance ToResourceProperties IngressIsInAddressListProperty where
  toResourceProperties :: IngressIsInAddressListProperty -> ResourceProperties
toResourceProperties IngressIsInAddressListProperty {()
ValueList Text
Value Text
haddock_workaround_ :: IngressIsInAddressListProperty -> ()
addressLists :: IngressIsInAddressListProperty -> ValueList Text
attribute :: IngressIsInAddressListProperty -> Value Text
haddock_workaround_ :: ()
addressLists :: ValueList Text
attribute :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::SES::MailManagerTrafficPolicy.IngressIsInAddressList",
         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 IngressIsInAddressListProperty where
  toJSON :: IngressIsInAddressListProperty -> Value
toJSON IngressIsInAddressListProperty {()
ValueList Text
Value Text
haddock_workaround_ :: IngressIsInAddressListProperty -> ()
addressLists :: IngressIsInAddressListProperty -> ValueList Text
attribute :: IngressIsInAddressListProperty -> 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" IngressIsInAddressListProperty where
  type PropertyType "AddressLists" IngressIsInAddressListProperty = ValueList Prelude.Text
  set :: PropertyType "AddressLists" IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> IngressIsInAddressListProperty
set PropertyType "AddressLists" IngressIsInAddressListProperty
newValue IngressIsInAddressListProperty {()
ValueList Text
Value Text
haddock_workaround_ :: IngressIsInAddressListProperty -> ()
addressLists :: IngressIsInAddressListProperty -> ValueList Text
attribute :: IngressIsInAddressListProperty -> Value Text
haddock_workaround_ :: ()
addressLists :: ValueList Text
attribute :: Value Text
..}
    = IngressIsInAddressListProperty {addressLists :: ValueList Text
addressLists = PropertyType "AddressLists" IngressIsInAddressListProperty
ValueList Text
newValue, ()
Value Text
haddock_workaround_ :: ()
attribute :: Value Text
haddock_workaround_ :: ()
attribute :: Value Text
..}
instance Property "Attribute" IngressIsInAddressListProperty where
  type PropertyType "Attribute" IngressIsInAddressListProperty = Value Prelude.Text
  set :: PropertyType "Attribute" IngressIsInAddressListProperty
-> IngressIsInAddressListProperty -> IngressIsInAddressListProperty
set PropertyType "Attribute" IngressIsInAddressListProperty
newValue IngressIsInAddressListProperty {()
ValueList Text
Value Text
haddock_workaround_ :: IngressIsInAddressListProperty -> ()
addressLists :: IngressIsInAddressListProperty -> ValueList Text
attribute :: IngressIsInAddressListProperty -> Value Text
haddock_workaround_ :: ()
addressLists :: ValueList Text
attribute :: Value Text
..}
    = IngressIsInAddressListProperty {attribute :: Value Text
attribute = PropertyType "Attribute" IngressIsInAddressListProperty
Value Text
newValue, ()
ValueList Text
haddock_workaround_ :: ()
addressLists :: ValueList Text
haddock_workaround_ :: ()
addressLists :: ValueList Text
..}