module Stratosphere.KinesisFirehose.DeliveryStream.HttpEndpointCommonAttributeProperty (
        HttpEndpointCommonAttributeProperty(..),
        mkHttpEndpointCommonAttributeProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data HttpEndpointCommonAttributeProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-kinesisfirehose-deliverystream-httpendpointcommonattribute.html>
    HttpEndpointCommonAttributeProperty {HttpEndpointCommonAttributeProperty -> ()
haddock_workaround_ :: (),
                                         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-kinesisfirehose-deliverystream-httpendpointcommonattribute.html#cfn-kinesisfirehose-deliverystream-httpendpointcommonattribute-attributename>
                                         HttpEndpointCommonAttributeProperty -> Value Text
attributeName :: (Value Prelude.Text),
                                         -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-kinesisfirehose-deliverystream-httpendpointcommonattribute.html#cfn-kinesisfirehose-deliverystream-httpendpointcommonattribute-attributevalue>
                                         HttpEndpointCommonAttributeProperty -> Value Text
attributeValue :: (Value Prelude.Text)}
  deriving stock (HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty -> Bool
(HttpEndpointCommonAttributeProperty
 -> HttpEndpointCommonAttributeProperty -> Bool)
-> (HttpEndpointCommonAttributeProperty
    -> HttpEndpointCommonAttributeProperty -> Bool)
-> Eq HttpEndpointCommonAttributeProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty -> Bool
== :: HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty -> Bool
$c/= :: HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty -> Bool
/= :: HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty -> Bool
Prelude.Eq, Int -> HttpEndpointCommonAttributeProperty -> ShowS
[HttpEndpointCommonAttributeProperty] -> ShowS
HttpEndpointCommonAttributeProperty -> String
(Int -> HttpEndpointCommonAttributeProperty -> ShowS)
-> (HttpEndpointCommonAttributeProperty -> String)
-> ([HttpEndpointCommonAttributeProperty] -> ShowS)
-> Show HttpEndpointCommonAttributeProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> HttpEndpointCommonAttributeProperty -> ShowS
showsPrec :: Int -> HttpEndpointCommonAttributeProperty -> ShowS
$cshow :: HttpEndpointCommonAttributeProperty -> String
show :: HttpEndpointCommonAttributeProperty -> String
$cshowList :: [HttpEndpointCommonAttributeProperty] -> ShowS
showList :: [HttpEndpointCommonAttributeProperty] -> ShowS
Prelude.Show)
mkHttpEndpointCommonAttributeProperty ::
  Value Prelude.Text
  -> Value Prelude.Text -> HttpEndpointCommonAttributeProperty
mkHttpEndpointCommonAttributeProperty :: Value Text -> Value Text -> HttpEndpointCommonAttributeProperty
mkHttpEndpointCommonAttributeProperty Value Text
attributeName Value Text
attributeValue
  = HttpEndpointCommonAttributeProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), attributeName :: Value Text
attributeName = Value Text
attributeName,
       attributeValue :: Value Text
attributeValue = Value Text
attributeValue}
instance ToResourceProperties HttpEndpointCommonAttributeProperty where
  toResourceProperties :: HttpEndpointCommonAttributeProperty -> ResourceProperties
toResourceProperties HttpEndpointCommonAttributeProperty {()
Value Text
haddock_workaround_ :: HttpEndpointCommonAttributeProperty -> ()
attributeName :: HttpEndpointCommonAttributeProperty -> Value Text
attributeValue :: HttpEndpointCommonAttributeProperty -> Value Text
haddock_workaround_ :: ()
attributeName :: Value Text
attributeValue :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::KinesisFirehose::DeliveryStream.HttpEndpointCommonAttribute",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"AttributeName" 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
attributeName,
                       Key
"AttributeValue" 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
attributeValue]}
instance JSON.ToJSON HttpEndpointCommonAttributeProperty where
  toJSON :: HttpEndpointCommonAttributeProperty -> Value
toJSON HttpEndpointCommonAttributeProperty {()
Value Text
haddock_workaround_ :: HttpEndpointCommonAttributeProperty -> ()
attributeName :: HttpEndpointCommonAttributeProperty -> Value Text
attributeValue :: HttpEndpointCommonAttributeProperty -> Value Text
haddock_workaround_ :: ()
attributeName :: Value Text
attributeValue :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"AttributeName" 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
attributeName,
         Key
"AttributeValue" 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
attributeValue]
instance Property "AttributeName" HttpEndpointCommonAttributeProperty where
  type PropertyType "AttributeName" HttpEndpointCommonAttributeProperty = Value Prelude.Text
  set :: PropertyType "AttributeName" HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty
set PropertyType "AttributeName" HttpEndpointCommonAttributeProperty
newValue HttpEndpointCommonAttributeProperty {()
Value Text
haddock_workaround_ :: HttpEndpointCommonAttributeProperty -> ()
attributeName :: HttpEndpointCommonAttributeProperty -> Value Text
attributeValue :: HttpEndpointCommonAttributeProperty -> Value Text
haddock_workaround_ :: ()
attributeName :: Value Text
attributeValue :: Value Text
..}
    = HttpEndpointCommonAttributeProperty
        {attributeName :: Value Text
attributeName = PropertyType "AttributeName" HttpEndpointCommonAttributeProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
attributeValue :: Value Text
haddock_workaround_ :: ()
attributeValue :: Value Text
..}
instance Property "AttributeValue" HttpEndpointCommonAttributeProperty where
  type PropertyType "AttributeValue" HttpEndpointCommonAttributeProperty = Value Prelude.Text
  set :: PropertyType "AttributeValue" HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty
-> HttpEndpointCommonAttributeProperty
set PropertyType "AttributeValue" HttpEndpointCommonAttributeProperty
newValue HttpEndpointCommonAttributeProperty {()
Value Text
haddock_workaround_ :: HttpEndpointCommonAttributeProperty -> ()
attributeName :: HttpEndpointCommonAttributeProperty -> Value Text
attributeValue :: HttpEndpointCommonAttributeProperty -> Value Text
haddock_workaround_ :: ()
attributeName :: Value Text
attributeValue :: Value Text
..}
    = HttpEndpointCommonAttributeProperty
        {attributeValue :: Value Text
attributeValue = PropertyType "AttributeValue" HttpEndpointCommonAttributeProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
attributeName :: Value Text
haddock_workaround_ :: ()
attributeName :: Value Text
..}