module Stratosphere.IoTEvents.AlarmModel (
        module Exports, AlarmModel(..), mkAlarmModel
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.IoTEvents.AlarmModel.AlarmCapabilitiesProperty as Exports
import {-# SOURCE #-} Stratosphere.IoTEvents.AlarmModel.AlarmEventActionsProperty as Exports
import {-# SOURCE #-} Stratosphere.IoTEvents.AlarmModel.AlarmRuleProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data AlarmModel
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html>
    AlarmModel {AlarmModel -> ()
haddock_workaround_ :: (),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-alarmcapabilities>
                AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmCapabilities :: (Prelude.Maybe AlarmCapabilitiesProperty),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-alarmeventactions>
                AlarmModel -> Maybe AlarmEventActionsProperty
alarmEventActions :: (Prelude.Maybe AlarmEventActionsProperty),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-alarmmodeldescription>
                AlarmModel -> Maybe (Value Text)
alarmModelDescription :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-alarmmodelname>
                AlarmModel -> Maybe (Value Text)
alarmModelName :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-alarmrule>
                AlarmModel -> AlarmRuleProperty
alarmRule :: AlarmRuleProperty,
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-key>
                AlarmModel -> Maybe (Value Text)
key :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-rolearn>
                AlarmModel -> Value Text
roleArn :: (Value Prelude.Text),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-severity>
                AlarmModel -> Maybe (Value Integer)
severity :: (Prelude.Maybe (Value Prelude.Integer)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-iotevents-alarmmodel.html#cfn-iotevents-alarmmodel-tags>
                AlarmModel -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag])}
  deriving stock (AlarmModel -> AlarmModel -> Bool
(AlarmModel -> AlarmModel -> Bool)
-> (AlarmModel -> AlarmModel -> Bool) -> Eq AlarmModel
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AlarmModel -> AlarmModel -> Bool
== :: AlarmModel -> AlarmModel -> Bool
$c/= :: AlarmModel -> AlarmModel -> Bool
/= :: AlarmModel -> AlarmModel -> Bool
Prelude.Eq, Int -> AlarmModel -> ShowS
[AlarmModel] -> ShowS
AlarmModel -> String
(Int -> AlarmModel -> ShowS)
-> (AlarmModel -> String)
-> ([AlarmModel] -> ShowS)
-> Show AlarmModel
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AlarmModel -> ShowS
showsPrec :: Int -> AlarmModel -> ShowS
$cshow :: AlarmModel -> String
show :: AlarmModel -> String
$cshowList :: [AlarmModel] -> ShowS
showList :: [AlarmModel] -> ShowS
Prelude.Show)
mkAlarmModel ::
  AlarmRuleProperty -> Value Prelude.Text -> AlarmModel
mkAlarmModel :: AlarmRuleProperty -> Value Text -> AlarmModel
mkAlarmModel AlarmRuleProperty
alarmRule Value Text
roleArn
  = AlarmModel
      {haddock_workaround_ :: ()
haddock_workaround_ = (), alarmRule :: AlarmRuleProperty
alarmRule = AlarmRuleProperty
alarmRule,
       roleArn :: Value Text
roleArn = Value Text
roleArn, alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmCapabilities = Maybe AlarmCapabilitiesProperty
forall a. Maybe a
Prelude.Nothing,
       alarmEventActions :: Maybe AlarmEventActionsProperty
alarmEventActions = Maybe AlarmEventActionsProperty
forall a. Maybe a
Prelude.Nothing,
       alarmModelDescription :: Maybe (Value Text)
alarmModelDescription = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       alarmModelName :: Maybe (Value Text)
alarmModelName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, key :: Maybe (Value Text)
key = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       severity :: Maybe (Value Integer)
severity = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties AlarmModel where
  toResourceProperties :: AlarmModel -> ResourceProperties
toResourceProperties AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::IoTEvents::AlarmModel",
         supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
                           [Key
"AlarmRule" Key -> AlarmRuleProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= AlarmRuleProperty
alarmRule, Key
"RoleArn" 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
roleArn]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> AlarmCapabilitiesProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AlarmCapabilities" (AlarmCapabilitiesProperty -> (Key, Value))
-> Maybe AlarmCapabilitiesProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AlarmCapabilitiesProperty
alarmCapabilities,
                               Key -> AlarmEventActionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AlarmEventActions" (AlarmEventActionsProperty -> (Key, Value))
-> Maybe AlarmEventActionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AlarmEventActionsProperty
alarmEventActions,
                               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..=) Key
"AlarmModelDescription"
                                 (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
alarmModelDescription,
                               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..=) Key
"AlarmModelName" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
alarmModelName,
                               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..=) Key
"Key" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
key,
                               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Severity" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
severity,
                               Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON AlarmModel where
  toJSON :: AlarmModel -> Value
toJSON AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
              [Key
"AlarmRule" Key -> AlarmRuleProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= AlarmRuleProperty
alarmRule, Key
"RoleArn" 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
roleArn]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> AlarmCapabilitiesProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AlarmCapabilities" (AlarmCapabilitiesProperty -> (Key, Value))
-> Maybe AlarmCapabilitiesProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AlarmCapabilitiesProperty
alarmCapabilities,
                  Key -> AlarmEventActionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AlarmEventActions" (AlarmEventActionsProperty -> (Key, Value))
-> Maybe AlarmEventActionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AlarmEventActionsProperty
alarmEventActions,
                  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..=) Key
"AlarmModelDescription"
                    (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
alarmModelDescription,
                  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..=) Key
"AlarmModelName" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
alarmModelName,
                  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..=) Key
"Key" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
key,
                  Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Severity" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
severity,
                  Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "AlarmCapabilities" AlarmModel where
  type PropertyType "AlarmCapabilities" AlarmModel = AlarmCapabilitiesProperty
  set :: PropertyType "AlarmCapabilities" AlarmModel
-> AlarmModel -> AlarmModel
set PropertyType "AlarmCapabilities" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmCapabilities = AlarmCapabilitiesProperty -> Maybe AlarmCapabilitiesProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AlarmCapabilities" AlarmModel
AlarmCapabilitiesProperty
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "AlarmEventActions" AlarmModel where
  type PropertyType "AlarmEventActions" AlarmModel = AlarmEventActionsProperty
  set :: PropertyType "AlarmEventActions" AlarmModel
-> AlarmModel -> AlarmModel
set PropertyType "AlarmEventActions" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {alarmEventActions :: Maybe AlarmEventActionsProperty
alarmEventActions = AlarmEventActionsProperty -> Maybe AlarmEventActionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AlarmEventActions" AlarmModel
AlarmEventActionsProperty
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "AlarmModelDescription" AlarmModel where
  type PropertyType "AlarmModelDescription" AlarmModel = Value Prelude.Text
  set :: PropertyType "AlarmModelDescription" AlarmModel
-> AlarmModel -> AlarmModel
set PropertyType "AlarmModelDescription" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {alarmModelDescription :: Maybe (Value Text)
alarmModelDescription = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AlarmModelDescription" AlarmModel
Value Text
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "AlarmModelName" AlarmModel where
  type PropertyType "AlarmModelName" AlarmModel = Value Prelude.Text
  set :: PropertyType "AlarmModelName" AlarmModel
-> AlarmModel -> AlarmModel
set PropertyType "AlarmModelName" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {alarmModelName :: Maybe (Value Text)
alarmModelName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AlarmModelName" AlarmModel
Value Text
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "AlarmRule" AlarmModel where
  type PropertyType "AlarmRule" AlarmModel = AlarmRuleProperty
  set :: PropertyType "AlarmRule" AlarmModel -> AlarmModel -> AlarmModel
set PropertyType "AlarmRule" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {alarmRule :: AlarmRuleProperty
alarmRule = PropertyType "AlarmRule" AlarmModel
AlarmRuleProperty
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "Key" AlarmModel where
  type PropertyType "Key" AlarmModel = Value Prelude.Text
  set :: PropertyType "Key" AlarmModel -> AlarmModel -> AlarmModel
set PropertyType "Key" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {key :: Maybe (Value Text)
key = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Key" AlarmModel
Value Text
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "RoleArn" AlarmModel where
  type PropertyType "RoleArn" AlarmModel = Value Prelude.Text
  set :: PropertyType "RoleArn" AlarmModel -> AlarmModel -> AlarmModel
set PropertyType "RoleArn" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..} = AlarmModel {roleArn :: Value Text
roleArn = PropertyType "RoleArn" AlarmModel
Value Text
newValue, Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
instance Property "Severity" AlarmModel where
  type PropertyType "Severity" AlarmModel = Value Prelude.Integer
  set :: PropertyType "Severity" AlarmModel -> AlarmModel -> AlarmModel
set PropertyType "Severity" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {severity :: Maybe (Value Integer)
severity = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Severity" AlarmModel
Value Integer
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Tags" AlarmModel where
  type PropertyType "Tags" AlarmModel = [Tag]
  set :: PropertyType "Tags" AlarmModel -> AlarmModel -> AlarmModel
set PropertyType "Tags" AlarmModel
newValue AlarmModel {Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: AlarmModel -> ()
alarmCapabilities :: AlarmModel -> Maybe AlarmCapabilitiesProperty
alarmEventActions :: AlarmModel -> Maybe AlarmEventActionsProperty
alarmModelDescription :: AlarmModel -> Maybe (Value Text)
alarmModelName :: AlarmModel -> Maybe (Value Text)
alarmRule :: AlarmModel -> AlarmRuleProperty
key :: AlarmModel -> Maybe (Value Text)
roleArn :: AlarmModel -> Value Text
severity :: AlarmModel -> Maybe (Value Integer)
tags :: AlarmModel -> Maybe [Tag]
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
tags :: Maybe [Tag]
..}
    = AlarmModel {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" AlarmModel
newValue, Maybe (Value Integer)
Maybe (Value Text)
Maybe AlarmCapabilitiesProperty
Maybe AlarmEventActionsProperty
()
Value Text
AlarmRuleProperty
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
haddock_workaround_ :: ()
alarmCapabilities :: Maybe AlarmCapabilitiesProperty
alarmEventActions :: Maybe AlarmEventActionsProperty
alarmModelDescription :: Maybe (Value Text)
alarmModelName :: Maybe (Value Text)
alarmRule :: AlarmRuleProperty
key :: Maybe (Value Text)
roleArn :: Value Text
severity :: Maybe (Value Integer)
..}