module Stratosphere.ARCRegionSwitch.Plan (
        module Exports, Plan(..), mkPlan
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.ARCRegionSwitch.Plan.AssociatedAlarmProperty as Exports
import {-# SOURCE #-} Stratosphere.ARCRegionSwitch.Plan.TriggerProperty as Exports
import {-# SOURCE #-} Stratosphere.ARCRegionSwitch.Plan.WorkflowProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data Plan
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html>
    Plan {Plan -> ()
haddock_workaround_ :: (),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-associatedalarms>
          Plan -> Maybe (Map Text AssociatedAlarmProperty)
associatedAlarms :: (Prelude.Maybe (Prelude.Map Prelude.Text AssociatedAlarmProperty)),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-description>
          Plan -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-executionrole>
          Plan -> Value Text
executionRole :: (Value Prelude.Text),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-name>
          Plan -> Value Text
name :: (Value Prelude.Text),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-primaryregion>
          Plan -> Maybe (Value Text)
primaryRegion :: (Prelude.Maybe (Value Prelude.Text)),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-recoveryapproach>
          Plan -> Value Text
recoveryApproach :: (Value Prelude.Text),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-recoverytimeobjectiveminutes>
          Plan -> Maybe (Value Double)
recoveryTimeObjectiveMinutes :: (Prelude.Maybe (Value Prelude.Double)),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-regions>
          Plan -> ValueList Text
regions :: (ValueList Prelude.Text),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-tags>
          Plan -> Maybe (Map Text (Value Text))
tags :: (Prelude.Maybe (Prelude.Map Prelude.Text (Value Prelude.Text))),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-triggers>
          Plan -> Maybe [TriggerProperty]
triggers :: (Prelude.Maybe [TriggerProperty]),
          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-arcregionswitch-plan.html#cfn-arcregionswitch-plan-workflows>
          Plan -> [WorkflowProperty]
workflows :: [WorkflowProperty]}
  deriving stock (Plan -> Plan -> Bool
(Plan -> Plan -> Bool) -> (Plan -> Plan -> Bool) -> Eq Plan
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Plan -> Plan -> Bool
== :: Plan -> Plan -> Bool
$c/= :: Plan -> Plan -> Bool
/= :: Plan -> Plan -> Bool
Prelude.Eq, Int -> Plan -> ShowS
[Plan] -> ShowS
Plan -> String
(Int -> Plan -> ShowS)
-> (Plan -> String) -> ([Plan] -> ShowS) -> Show Plan
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Plan -> ShowS
showsPrec :: Int -> Plan -> ShowS
$cshow :: Plan -> String
show :: Plan -> String
$cshowList :: [Plan] -> ShowS
showList :: [Plan] -> ShowS
Prelude.Show)
mkPlan ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> Value Prelude.Text
        -> ValueList Prelude.Text -> [WorkflowProperty] -> Plan
mkPlan :: Value Text
-> Value Text
-> Value Text
-> ValueList Text
-> [WorkflowProperty]
-> Plan
mkPlan Value Text
executionRole Value Text
name Value Text
recoveryApproach ValueList Text
regions [WorkflowProperty]
workflows
  = Plan
      {haddock_workaround_ :: ()
haddock_workaround_ = (), executionRole :: Value Text
executionRole = Value Text
executionRole,
       name :: Value Text
name = Value Text
name, recoveryApproach :: Value Text
recoveryApproach = Value Text
recoveryApproach,
       regions :: ValueList Text
regions = ValueList Text
regions, workflows :: [WorkflowProperty]
workflows = [WorkflowProperty]
workflows,
       associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
associatedAlarms = Maybe (Map Text AssociatedAlarmProperty)
forall a. Maybe a
Prelude.Nothing, description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       primaryRegion :: Maybe (Value Text)
primaryRegion = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       recoveryTimeObjectiveMinutes :: Maybe (Value Double)
recoveryTimeObjectiveMinutes = Maybe (Value Double)
forall a. Maybe a
Prelude.Nothing,
       tags :: Maybe (Map Text (Value Text))
tags = Maybe (Map Text (Value Text))
forall a. Maybe a
Prelude.Nothing, triggers :: Maybe [TriggerProperty]
triggers = Maybe [TriggerProperty]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Plan where
  toResourceProperties :: Plan -> ResourceProperties
toResourceProperties Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::ARCRegionSwitch::Plan",
         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
"ExecutionRole" 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
executionRole, 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
"RecoveryApproach" 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
recoveryApproach,
                            Key
"Regions" 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
regions, Key
"Workflows" Key -> [WorkflowProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [WorkflowProperty]
workflows]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> Map Text AssociatedAlarmProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AssociatedAlarms" (Map Text AssociatedAlarmProperty -> (Key, Value))
-> Maybe (Map Text AssociatedAlarmProperty) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text AssociatedAlarmProperty)
associatedAlarms,
                               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
"Description" (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)
description,
                               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
"PrimaryRegion" (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)
primaryRegion,
                               Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RecoveryTimeObjectiveMinutes"
                                 (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
recoveryTimeObjectiveMinutes,
                               Key -> Map Text (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
"Tags" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
tags,
                               Key -> [TriggerProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Triggers" ([TriggerProperty] -> (Key, Value))
-> Maybe [TriggerProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [TriggerProperty]
triggers]))}
instance JSON.ToJSON Plan where
  toJSON :: Plan -> Value
toJSON Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = [(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
"ExecutionRole" 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
executionRole, 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
"RecoveryApproach" 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
recoveryApproach,
               Key
"Regions" 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
regions, Key
"Workflows" Key -> [WorkflowProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [WorkflowProperty]
workflows]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> Map Text AssociatedAlarmProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AssociatedAlarms" (Map Text AssociatedAlarmProperty -> (Key, Value))
-> Maybe (Map Text AssociatedAlarmProperty) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text AssociatedAlarmProperty)
associatedAlarms,
                  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
"Description" (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)
description,
                  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
"PrimaryRegion" (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)
primaryRegion,
                  Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RecoveryTimeObjectiveMinutes"
                    (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
recoveryTimeObjectiveMinutes,
                  Key -> Map Text (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
"Tags" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
tags,
                  Key -> [TriggerProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Triggers" ([TriggerProperty] -> (Key, Value))
-> Maybe [TriggerProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [TriggerProperty]
triggers])))
instance Property "AssociatedAlarms" Plan where
  type PropertyType "AssociatedAlarms" Plan = Prelude.Map Prelude.Text AssociatedAlarmProperty
  set :: PropertyType "AssociatedAlarms" Plan -> Plan -> Plan
set PropertyType "AssociatedAlarms" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = Plan {associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
associatedAlarms = Map Text AssociatedAlarmProperty
-> Maybe (Map Text AssociatedAlarmProperty)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text AssociatedAlarmProperty
PropertyType "AssociatedAlarms" Plan
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "Description" Plan where
  type PropertyType "Description" Plan = Value Prelude.Text
  set :: PropertyType "Description" Plan -> Plan -> Plan
set PropertyType "Description" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = Plan {description :: Maybe (Value Text)
description = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Description" Plan
Value Text
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "ExecutionRole" Plan where
  type PropertyType "ExecutionRole" Plan = Value Prelude.Text
  set :: PropertyType "ExecutionRole" Plan -> Plan -> Plan
set PropertyType "ExecutionRole" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..} = Plan {executionRole :: Value Text
executionRole = PropertyType "ExecutionRole" Plan
Value Text
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "Name" Plan where
  type PropertyType "Name" Plan = Value Prelude.Text
  set :: PropertyType "Name" Plan -> Plan -> Plan
set PropertyType "Name" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..} = Plan {name :: Value Text
name = PropertyType "Name" Plan
Value Text
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "PrimaryRegion" Plan where
  type PropertyType "PrimaryRegion" Plan = Value Prelude.Text
  set :: PropertyType "PrimaryRegion" Plan -> Plan -> Plan
set PropertyType "PrimaryRegion" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = Plan {primaryRegion :: Maybe (Value Text)
primaryRegion = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PrimaryRegion" Plan
Value Text
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "RecoveryApproach" Plan where
  type PropertyType "RecoveryApproach" Plan = Value Prelude.Text
  set :: PropertyType "RecoveryApproach" Plan -> Plan -> Plan
set PropertyType "RecoveryApproach" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..} = Plan {recoveryApproach :: Value Text
recoveryApproach = PropertyType "RecoveryApproach" Plan
Value Text
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "RecoveryTimeObjectiveMinutes" Plan where
  type PropertyType "RecoveryTimeObjectiveMinutes" Plan = Value Prelude.Double
  set :: PropertyType "RecoveryTimeObjectiveMinutes" Plan -> Plan -> Plan
set PropertyType "RecoveryTimeObjectiveMinutes" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = Plan {recoveryTimeObjectiveMinutes :: Maybe (Value Double)
recoveryTimeObjectiveMinutes = Value Double -> Maybe (Value Double)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RecoveryTimeObjectiveMinutes" Plan
Value Double
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "Regions" Plan where
  type PropertyType "Regions" Plan = ValueList Prelude.Text
  set :: PropertyType "Regions" Plan -> Plan -> Plan
set PropertyType "Regions" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..} = Plan {regions :: ValueList Text
regions = PropertyType "Regions" Plan
ValueList Text
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "Tags" Plan where
  type PropertyType "Tags" Plan = Prelude.Map Prelude.Text (Value Prelude.Text)
  set :: PropertyType "Tags" Plan -> Plan -> Plan
set PropertyType "Tags" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..} = Plan {tags :: Maybe (Map Text (Value Text))
tags = Map Text (Value Text) -> Maybe (Map Text (Value Text))
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text (Value Text)
PropertyType "Tags" Plan
newValue, [WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
instance Property "Triggers" Plan where
  type PropertyType "Triggers" Plan = [TriggerProperty]
  set :: PropertyType "Triggers" Plan -> Plan -> Plan
set PropertyType "Triggers" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..}
    = Plan {triggers :: Maybe [TriggerProperty]
triggers = [TriggerProperty] -> Maybe [TriggerProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [TriggerProperty]
PropertyType "Triggers" Plan
newValue, [WorkflowProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
workflows :: [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
workflows :: [WorkflowProperty]
..}
instance Property "Workflows" Plan where
  type PropertyType "Workflows" Plan = [WorkflowProperty]
  set :: PropertyType "Workflows" Plan -> Plan -> Plan
set PropertyType "Workflows" Plan
newValue Plan {[WorkflowProperty]
Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: Plan -> ()
associatedAlarms :: Plan -> Maybe (Map Text AssociatedAlarmProperty)
description :: Plan -> Maybe (Value Text)
executionRole :: Plan -> Value Text
name :: Plan -> Value Text
primaryRegion :: Plan -> Maybe (Value Text)
recoveryApproach :: Plan -> Value Text
recoveryTimeObjectiveMinutes :: Plan -> Maybe (Value Double)
regions :: Plan -> ValueList Text
tags :: Plan -> Maybe (Map Text (Value Text))
triggers :: Plan -> Maybe [TriggerProperty]
workflows :: Plan -> [WorkflowProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
workflows :: [WorkflowProperty]
..} = Plan {workflows :: [WorkflowProperty]
workflows = [WorkflowProperty]
PropertyType "Workflows" Plan
newValue, Maybe [TriggerProperty]
Maybe (Map Text (Value Text))
Maybe (Map Text AssociatedAlarmProperty)
Maybe (Value Double)
Maybe (Value Text)
()
ValueList Text
Value Text
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
haddock_workaround_ :: ()
associatedAlarms :: Maybe (Map Text AssociatedAlarmProperty)
description :: Maybe (Value Text)
executionRole :: Value Text
name :: Value Text
primaryRegion :: Maybe (Value Text)
recoveryApproach :: Value Text
recoveryTimeObjectiveMinutes :: Maybe (Value Double)
regions :: ValueList Text
tags :: Maybe (Map Text (Value Text))
triggers :: Maybe [TriggerProperty]
..}