module Stratosphere.IoT.TopicRule.TimestreamDimensionProperty (
TimestreamDimensionProperty(..), mkTimestreamDimensionProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data TimestreamDimensionProperty
=
TimestreamDimensionProperty {TimestreamDimensionProperty -> ()
haddock_workaround_ :: (),
TimestreamDimensionProperty -> Value Text
name :: (Value Prelude.Text),
TimestreamDimensionProperty -> Value Text
value :: (Value Prelude.Text)}
deriving stock (TimestreamDimensionProperty -> TimestreamDimensionProperty -> Bool
(TimestreamDimensionProperty
-> TimestreamDimensionProperty -> Bool)
-> (TimestreamDimensionProperty
-> TimestreamDimensionProperty -> Bool)
-> Eq TimestreamDimensionProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TimestreamDimensionProperty -> TimestreamDimensionProperty -> Bool
== :: TimestreamDimensionProperty -> TimestreamDimensionProperty -> Bool
$c/= :: TimestreamDimensionProperty -> TimestreamDimensionProperty -> Bool
/= :: TimestreamDimensionProperty -> TimestreamDimensionProperty -> Bool
Prelude.Eq, Int -> TimestreamDimensionProperty -> ShowS
[TimestreamDimensionProperty] -> ShowS
TimestreamDimensionProperty -> String
(Int -> TimestreamDimensionProperty -> ShowS)
-> (TimestreamDimensionProperty -> String)
-> ([TimestreamDimensionProperty] -> ShowS)
-> Show TimestreamDimensionProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TimestreamDimensionProperty -> ShowS
showsPrec :: Int -> TimestreamDimensionProperty -> ShowS
$cshow :: TimestreamDimensionProperty -> String
show :: TimestreamDimensionProperty -> String
$cshowList :: [TimestreamDimensionProperty] -> ShowS
showList :: [TimestreamDimensionProperty] -> ShowS
Prelude.Show)
mkTimestreamDimensionProperty ::
Value Prelude.Text
-> Value Prelude.Text -> TimestreamDimensionProperty
mkTimestreamDimensionProperty :: Value Text -> Value Text -> TimestreamDimensionProperty
mkTimestreamDimensionProperty Value Text
name Value Text
value
= TimestreamDimensionProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), name :: Value Text
name = Value Text
name, value :: Value Text
value = Value Text
value}
instance ToResourceProperties TimestreamDimensionProperty where
toResourceProperties :: TimestreamDimensionProperty -> ResourceProperties
toResourceProperties TimestreamDimensionProperty {()
Value Text
haddock_workaround_ :: TimestreamDimensionProperty -> ()
name :: TimestreamDimensionProperty -> Value Text
value :: TimestreamDimensionProperty -> Value Text
haddock_workaround_ :: ()
name :: Value Text
value :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::IoT::TopicRule.TimestreamDimension",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"Name" 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
name, Key
"Value" 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
value]}
instance JSON.ToJSON TimestreamDimensionProperty where
toJSON :: TimestreamDimensionProperty -> Value
toJSON TimestreamDimensionProperty {()
Value Text
haddock_workaround_ :: TimestreamDimensionProperty -> ()
name :: TimestreamDimensionProperty -> Value Text
value :: TimestreamDimensionProperty -> Value Text
haddock_workaround_ :: ()
name :: Value Text
value :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object [Key
"Name" 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
name, Key
"Value" 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
value]
instance Property "Name" TimestreamDimensionProperty where
type PropertyType "Name" TimestreamDimensionProperty = Value Prelude.Text
set :: PropertyType "Name" TimestreamDimensionProperty
-> TimestreamDimensionProperty -> TimestreamDimensionProperty
set PropertyType "Name" TimestreamDimensionProperty
newValue TimestreamDimensionProperty {()
Value Text
haddock_workaround_ :: TimestreamDimensionProperty -> ()
name :: TimestreamDimensionProperty -> Value Text
value :: TimestreamDimensionProperty -> Value Text
haddock_workaround_ :: ()
name :: Value Text
value :: Value Text
..}
= TimestreamDimensionProperty {name :: Value Text
name = PropertyType "Name" TimestreamDimensionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
value :: Value Text
haddock_workaround_ :: ()
value :: Value Text
..}
instance Property "Value" TimestreamDimensionProperty where
type PropertyType "Value" TimestreamDimensionProperty = Value Prelude.Text
set :: PropertyType "Value" TimestreamDimensionProperty
-> TimestreamDimensionProperty -> TimestreamDimensionProperty
set PropertyType "Value" TimestreamDimensionProperty
newValue TimestreamDimensionProperty {()
Value Text
haddock_workaround_ :: TimestreamDimensionProperty -> ()
name :: TimestreamDimensionProperty -> Value Text
value :: TimestreamDimensionProperty -> Value Text
haddock_workaround_ :: ()
name :: Value Text
value :: Value Text
..}
= TimestreamDimensionProperty {value :: Value Text
value = PropertyType "Value" TimestreamDimensionProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
name :: Value Text
haddock_workaround_ :: ()
name :: Value Text
..}