module Stratosphere.CustomerProfiles.CalculatedAttributeDefinition.AttributeDetailsProperty (
        module Exports, AttributeDetailsProperty(..),
        mkAttributeDetailsProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.CustomerProfiles.CalculatedAttributeDefinition.AttributeItemProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data AttributeDetailsProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-customerprofiles-calculatedattributedefinition-attributedetails.html>
    AttributeDetailsProperty {AttributeDetailsProperty -> ()
haddock_workaround_ :: (),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-customerprofiles-calculatedattributedefinition-attributedetails.html#cfn-customerprofiles-calculatedattributedefinition-attributedetails-attributes>
                              AttributeDetailsProperty -> [AttributeItemProperty]
attributes :: [AttributeItemProperty],
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-customerprofiles-calculatedattributedefinition-attributedetails.html#cfn-customerprofiles-calculatedattributedefinition-attributedetails-expression>
                              AttributeDetailsProperty -> Value Text
expression :: (Value Prelude.Text)}
  deriving stock (AttributeDetailsProperty -> AttributeDetailsProperty -> Bool
(AttributeDetailsProperty -> AttributeDetailsProperty -> Bool)
-> (AttributeDetailsProperty -> AttributeDetailsProperty -> Bool)
-> Eq AttributeDetailsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AttributeDetailsProperty -> AttributeDetailsProperty -> Bool
== :: AttributeDetailsProperty -> AttributeDetailsProperty -> Bool
$c/= :: AttributeDetailsProperty -> AttributeDetailsProperty -> Bool
/= :: AttributeDetailsProperty -> AttributeDetailsProperty -> Bool
Prelude.Eq, Int -> AttributeDetailsProperty -> ShowS
[AttributeDetailsProperty] -> ShowS
AttributeDetailsProperty -> String
(Int -> AttributeDetailsProperty -> ShowS)
-> (AttributeDetailsProperty -> String)
-> ([AttributeDetailsProperty] -> ShowS)
-> Show AttributeDetailsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AttributeDetailsProperty -> ShowS
showsPrec :: Int -> AttributeDetailsProperty -> ShowS
$cshow :: AttributeDetailsProperty -> String
show :: AttributeDetailsProperty -> String
$cshowList :: [AttributeDetailsProperty] -> ShowS
showList :: [AttributeDetailsProperty] -> ShowS
Prelude.Show)
mkAttributeDetailsProperty ::
  [AttributeItemProperty]
  -> Value Prelude.Text -> AttributeDetailsProperty
mkAttributeDetailsProperty :: [AttributeItemProperty] -> Value Text -> AttributeDetailsProperty
mkAttributeDetailsProperty [AttributeItemProperty]
attributes Value Text
expression
  = AttributeDetailsProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), attributes :: [AttributeItemProperty]
attributes = [AttributeItemProperty]
attributes,
       expression :: Value Text
expression = Value Text
expression}
instance ToResourceProperties AttributeDetailsProperty where
  toResourceProperties :: AttributeDetailsProperty -> ResourceProperties
toResourceProperties AttributeDetailsProperty {[AttributeItemProperty]
()
Value Text
haddock_workaround_ :: AttributeDetailsProperty -> ()
attributes :: AttributeDetailsProperty -> [AttributeItemProperty]
expression :: AttributeDetailsProperty -> Value Text
haddock_workaround_ :: ()
attributes :: [AttributeItemProperty]
expression :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::CustomerProfiles::CalculatedAttributeDefinition.AttributeDetails",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"Attributes" Key -> [AttributeItemProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [AttributeItemProperty]
attributes,
                       Key
"Expression" 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
expression]}
instance JSON.ToJSON AttributeDetailsProperty where
  toJSON :: AttributeDetailsProperty -> Value
toJSON AttributeDetailsProperty {[AttributeItemProperty]
()
Value Text
haddock_workaround_ :: AttributeDetailsProperty -> ()
attributes :: AttributeDetailsProperty -> [AttributeItemProperty]
expression :: AttributeDetailsProperty -> Value Text
haddock_workaround_ :: ()
attributes :: [AttributeItemProperty]
expression :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"Attributes" Key -> [AttributeItemProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [AttributeItemProperty]
attributes, Key
"Expression" 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
expression]
instance Property "Attributes" AttributeDetailsProperty where
  type PropertyType "Attributes" AttributeDetailsProperty = [AttributeItemProperty]
  set :: PropertyType "Attributes" AttributeDetailsProperty
-> AttributeDetailsProperty -> AttributeDetailsProperty
set PropertyType "Attributes" AttributeDetailsProperty
newValue AttributeDetailsProperty {[AttributeItemProperty]
()
Value Text
haddock_workaround_ :: AttributeDetailsProperty -> ()
attributes :: AttributeDetailsProperty -> [AttributeItemProperty]
expression :: AttributeDetailsProperty -> Value Text
haddock_workaround_ :: ()
attributes :: [AttributeItemProperty]
expression :: Value Text
..}
    = AttributeDetailsProperty {attributes :: [AttributeItemProperty]
attributes = [AttributeItemProperty]
PropertyType "Attributes" AttributeDetailsProperty
newValue, ()
Value Text
haddock_workaround_ :: ()
expression :: Value Text
haddock_workaround_ :: ()
expression :: Value Text
..}
instance Property "Expression" AttributeDetailsProperty where
  type PropertyType "Expression" AttributeDetailsProperty = Value Prelude.Text
  set :: PropertyType "Expression" AttributeDetailsProperty
-> AttributeDetailsProperty -> AttributeDetailsProperty
set PropertyType "Expression" AttributeDetailsProperty
newValue AttributeDetailsProperty {[AttributeItemProperty]
()
Value Text
haddock_workaround_ :: AttributeDetailsProperty -> ()
attributes :: AttributeDetailsProperty -> [AttributeItemProperty]
expression :: AttributeDetailsProperty -> Value Text
haddock_workaround_ :: ()
attributes :: [AttributeItemProperty]
expression :: Value Text
..}
    = AttributeDetailsProperty {expression :: Value Text
expression = PropertyType "Expression" AttributeDetailsProperty
Value Text
newValue, [AttributeItemProperty]
()
haddock_workaround_ :: ()
attributes :: [AttributeItemProperty]
haddock_workaround_ :: ()
attributes :: [AttributeItemProperty]
..}