module Stratosphere.Backup.LogicallyAirGappedBackupVault (
        module Exports, LogicallyAirGappedBackupVault(..),
        mkLogicallyAirGappedBackupVault
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Backup.LogicallyAirGappedBackupVault.NotificationObjectTypeProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data LogicallyAirGappedBackupVault
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html>
    LogicallyAirGappedBackupVault {LogicallyAirGappedBackupVault -> ()
haddock_workaround_ :: (),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html#cfn-backup-logicallyairgappedbackupvault-accesspolicy>
                                   LogicallyAirGappedBackupVault -> Maybe Object
accessPolicy :: (Prelude.Maybe JSON.Object),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html#cfn-backup-logicallyairgappedbackupvault-backupvaultname>
                                   LogicallyAirGappedBackupVault -> Value Text
backupVaultName :: (Value Prelude.Text),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html#cfn-backup-logicallyairgappedbackupvault-backupvaulttags>
                                   LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
backupVaultTags :: (Prelude.Maybe (Prelude.Map Prelude.Text (Value Prelude.Text))),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html#cfn-backup-logicallyairgappedbackupvault-maxretentiondays>
                                   LogicallyAirGappedBackupVault -> Value Integer
maxRetentionDays :: (Value Prelude.Integer),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html#cfn-backup-logicallyairgappedbackupvault-minretentiondays>
                                   LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: (Value Prelude.Integer),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-backup-logicallyairgappedbackupvault.html#cfn-backup-logicallyairgappedbackupvault-notifications>
                                   LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
notifications :: (Prelude.Maybe NotificationObjectTypeProperty)}
  deriving stock (LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> Bool
(LogicallyAirGappedBackupVault
 -> LogicallyAirGappedBackupVault -> Bool)
-> (LogicallyAirGappedBackupVault
    -> LogicallyAirGappedBackupVault -> Bool)
-> Eq LogicallyAirGappedBackupVault
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> Bool
== :: LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> Bool
$c/= :: LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> Bool
/= :: LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> Bool
Prelude.Eq, Int -> LogicallyAirGappedBackupVault -> ShowS
[LogicallyAirGappedBackupVault] -> ShowS
LogicallyAirGappedBackupVault -> String
(Int -> LogicallyAirGappedBackupVault -> ShowS)
-> (LogicallyAirGappedBackupVault -> String)
-> ([LogicallyAirGappedBackupVault] -> ShowS)
-> Show LogicallyAirGappedBackupVault
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> LogicallyAirGappedBackupVault -> ShowS
showsPrec :: Int -> LogicallyAirGappedBackupVault -> ShowS
$cshow :: LogicallyAirGappedBackupVault -> String
show :: LogicallyAirGappedBackupVault -> String
$cshowList :: [LogicallyAirGappedBackupVault] -> ShowS
showList :: [LogicallyAirGappedBackupVault] -> ShowS
Prelude.Show)
mkLogicallyAirGappedBackupVault ::
  Value Prelude.Text
  -> Value Prelude.Integer
     -> Value Prelude.Integer -> LogicallyAirGappedBackupVault
mkLogicallyAirGappedBackupVault :: Value Text
-> Value Integer -> Value Integer -> LogicallyAirGappedBackupVault
mkLogicallyAirGappedBackupVault
  Value Text
backupVaultName
  Value Integer
maxRetentionDays
  Value Integer
minRetentionDays
  = LogicallyAirGappedBackupVault
      {haddock_workaround_ :: ()
haddock_workaround_ = (), backupVaultName :: Value Text
backupVaultName = Value Text
backupVaultName,
       maxRetentionDays :: Value Integer
maxRetentionDays = Value Integer
maxRetentionDays,
       minRetentionDays :: Value Integer
minRetentionDays = Value Integer
minRetentionDays,
       accessPolicy :: Maybe Object
accessPolicy = Maybe Object
forall a. Maybe a
Prelude.Nothing, backupVaultTags :: Maybe (Map Text (Value Text))
backupVaultTags = Maybe (Map Text (Value Text))
forall a. Maybe a
Prelude.Nothing,
       notifications :: Maybe NotificationObjectTypeProperty
notifications = Maybe NotificationObjectTypeProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties LogicallyAirGappedBackupVault where
  toResourceProperties :: LogicallyAirGappedBackupVault -> ResourceProperties
toResourceProperties LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Backup::LogicallyAirGappedBackupVault",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         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
"BackupVaultName" 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
backupVaultName,
                            Key
"MaxRetentionDays" 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..= Value Integer
maxRetentionDays,
                            Key
"MinRetentionDays" 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..= Value Integer
minRetentionDays]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AccessPolicy" (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
accessPolicy,
                               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
"BackupVaultTags" (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))
backupVaultTags,
                               Key -> NotificationObjectTypeProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Notifications" (NotificationObjectTypeProperty -> (Key, Value))
-> Maybe NotificationObjectTypeProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NotificationObjectTypeProperty
notifications]))}
instance JSON.ToJSON LogicallyAirGappedBackupVault where
  toJSON :: LogicallyAirGappedBackupVault -> Value
toJSON LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = [(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
"BackupVaultName" 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
backupVaultName,
               Key
"MaxRetentionDays" 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..= Value Integer
maxRetentionDays,
               Key
"MinRetentionDays" 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..= Value Integer
minRetentionDays]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AccessPolicy" (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
accessPolicy,
                  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
"BackupVaultTags" (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))
backupVaultTags,
                  Key -> NotificationObjectTypeProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Notifications" (NotificationObjectTypeProperty -> (Key, Value))
-> Maybe NotificationObjectTypeProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NotificationObjectTypeProperty
notifications])))
instance Property "AccessPolicy" LogicallyAirGappedBackupVault where
  type PropertyType "AccessPolicy" LogicallyAirGappedBackupVault = JSON.Object
  set :: PropertyType "AccessPolicy" LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> LogicallyAirGappedBackupVault
set PropertyType "AccessPolicy" LogicallyAirGappedBackupVault
newValue LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = LogicallyAirGappedBackupVault
        {accessPolicy :: Maybe Object
accessPolicy = Object -> Maybe Object
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Object
PropertyType "AccessPolicy" LogicallyAirGappedBackupVault
newValue, Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
instance Property "BackupVaultName" LogicallyAirGappedBackupVault where
  type PropertyType "BackupVaultName" LogicallyAirGappedBackupVault = Value Prelude.Text
  set :: PropertyType "BackupVaultName" LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> LogicallyAirGappedBackupVault
set PropertyType "BackupVaultName" LogicallyAirGappedBackupVault
newValue LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = LogicallyAirGappedBackupVault {backupVaultName :: Value Text
backupVaultName = PropertyType "BackupVaultName" LogicallyAirGappedBackupVault
Value Text
newValue, Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
instance Property "BackupVaultTags" LogicallyAirGappedBackupVault where
  type PropertyType "BackupVaultTags" LogicallyAirGappedBackupVault = Prelude.Map Prelude.Text (Value Prelude.Text)
  set :: PropertyType "BackupVaultTags" LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> LogicallyAirGappedBackupVault
set PropertyType "BackupVaultTags" LogicallyAirGappedBackupVault
newValue LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = LogicallyAirGappedBackupVault
        {backupVaultTags :: Maybe (Map Text (Value Text))
backupVaultTags = 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 "BackupVaultTags" LogicallyAirGappedBackupVault
newValue, Maybe Object
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
instance Property "MaxRetentionDays" LogicallyAirGappedBackupVault where
  type PropertyType "MaxRetentionDays" LogicallyAirGappedBackupVault = Value Prelude.Integer
  set :: PropertyType "MaxRetentionDays" LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> LogicallyAirGappedBackupVault
set PropertyType "MaxRetentionDays" LogicallyAirGappedBackupVault
newValue LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = LogicallyAirGappedBackupVault {maxRetentionDays :: Value Integer
maxRetentionDays = PropertyType "MaxRetentionDays" LogicallyAirGappedBackupVault
Value Integer
newValue, Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
instance Property "MinRetentionDays" LogicallyAirGappedBackupVault where
  type PropertyType "MinRetentionDays" LogicallyAirGappedBackupVault = Value Prelude.Integer
  set :: PropertyType "MinRetentionDays" LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> LogicallyAirGappedBackupVault
set PropertyType "MinRetentionDays" LogicallyAirGappedBackupVault
newValue LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = LogicallyAirGappedBackupVault {minRetentionDays :: Value Integer
minRetentionDays = PropertyType "MinRetentionDays" LogicallyAirGappedBackupVault
Value Integer
newValue, Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
instance Property "Notifications" LogicallyAirGappedBackupVault where
  type PropertyType "Notifications" LogicallyAirGappedBackupVault = NotificationObjectTypeProperty
  set :: PropertyType "Notifications" LogicallyAirGappedBackupVault
-> LogicallyAirGappedBackupVault -> LogicallyAirGappedBackupVault
set PropertyType "Notifications" LogicallyAirGappedBackupVault
newValue LogicallyAirGappedBackupVault {Maybe Object
Maybe (Map Text (Value Text))
Maybe NotificationObjectTypeProperty
()
Value Integer
Value Text
haddock_workaround_ :: LogicallyAirGappedBackupVault -> ()
accessPolicy :: LogicallyAirGappedBackupVault -> Maybe Object
backupVaultName :: LogicallyAirGappedBackupVault -> Value Text
backupVaultTags :: LogicallyAirGappedBackupVault -> Maybe (Map Text (Value Text))
maxRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
minRetentionDays :: LogicallyAirGappedBackupVault -> Value Integer
notifications :: LogicallyAirGappedBackupVault
-> Maybe NotificationObjectTypeProperty
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
notifications :: Maybe NotificationObjectTypeProperty
..}
    = LogicallyAirGappedBackupVault
        {notifications :: Maybe NotificationObjectTypeProperty
notifications = NotificationObjectTypeProperty
-> Maybe NotificationObjectTypeProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Notifications" LogicallyAirGappedBackupVault
NotificationObjectTypeProperty
newValue, Maybe Object
Maybe (Map Text (Value Text))
()
Value Integer
Value Text
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
haddock_workaround_ :: ()
accessPolicy :: Maybe Object
backupVaultName :: Value Text
backupVaultTags :: Maybe (Map Text (Value Text))
maxRetentionDays :: Value Integer
minRetentionDays :: Value Integer
..}