module Stratosphere.EFS.FileSystem (
        module Exports, FileSystem(..), mkFileSystem
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.EFS.FileSystem.BackupPolicyProperty as Exports
import {-# SOURCE #-} Stratosphere.EFS.FileSystem.ElasticFileSystemTagProperty as Exports
import {-# SOURCE #-} Stratosphere.EFS.FileSystem.FileSystemProtectionProperty as Exports
import {-# SOURCE #-} Stratosphere.EFS.FileSystem.LifecyclePolicyProperty as Exports
import {-# SOURCE #-} Stratosphere.EFS.FileSystem.ReplicationConfigurationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data FileSystem
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html>
    FileSystem {FileSystem -> ()
haddock_workaround_ :: (),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-availabilityzonename>
                FileSystem -> Maybe (Value Text)
availabilityZoneName :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-backuppolicy>
                FileSystem -> Maybe BackupPolicyProperty
backupPolicy :: (Prelude.Maybe BackupPolicyProperty),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-bypasspolicylockoutsafetycheck>
                FileSystem -> Maybe (Value Bool)
bypassPolicyLockoutSafetyCheck :: (Prelude.Maybe (Value Prelude.Bool)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-encrypted>
                FileSystem -> Maybe (Value Bool)
encrypted :: (Prelude.Maybe (Value Prelude.Bool)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-filesystempolicy>
                FileSystem -> Maybe Object
fileSystemPolicy :: (Prelude.Maybe JSON.Object),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-filesystemprotection>
                FileSystem -> Maybe FileSystemProtectionProperty
fileSystemProtection :: (Prelude.Maybe FileSystemProtectionProperty),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-filesystemtags>
                FileSystem -> Maybe [ElasticFileSystemTagProperty]
fileSystemTags :: (Prelude.Maybe [ElasticFileSystemTagProperty]),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-kmskeyid>
                FileSystem -> Maybe (Value Text)
kmsKeyId :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-lifecyclepolicies>
                FileSystem -> Maybe [LifecyclePolicyProperty]
lifecyclePolicies :: (Prelude.Maybe [LifecyclePolicyProperty]),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-performancemode>
                FileSystem -> Maybe (Value Text)
performanceMode :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-provisionedthroughputinmibps>
                FileSystem -> Maybe (Value Double)
provisionedThroughputInMibps :: (Prelude.Maybe (Value Prelude.Double)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-replicationconfiguration>
                FileSystem -> Maybe ReplicationConfigurationProperty
replicationConfiguration :: (Prelude.Maybe ReplicationConfigurationProperty),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-efs-filesystem.html#cfn-efs-filesystem-throughputmode>
                FileSystem -> Maybe (Value Text)
throughputMode :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (FileSystem -> FileSystem -> Bool
(FileSystem -> FileSystem -> Bool)
-> (FileSystem -> FileSystem -> Bool) -> Eq FileSystem
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: FileSystem -> FileSystem -> Bool
== :: FileSystem -> FileSystem -> Bool
$c/= :: FileSystem -> FileSystem -> Bool
/= :: FileSystem -> FileSystem -> Bool
Prelude.Eq, Int -> FileSystem -> ShowS
[FileSystem] -> ShowS
FileSystem -> String
(Int -> FileSystem -> ShowS)
-> (FileSystem -> String)
-> ([FileSystem] -> ShowS)
-> Show FileSystem
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> FileSystem -> ShowS
showsPrec :: Int -> FileSystem -> ShowS
$cshow :: FileSystem -> String
show :: FileSystem -> String
$cshowList :: [FileSystem] -> ShowS
showList :: [FileSystem] -> ShowS
Prelude.Show)
mkFileSystem :: FileSystem
mkFileSystem :: FileSystem
mkFileSystem
  = FileSystem
      {haddock_workaround_ :: ()
haddock_workaround_ = (), availabilityZoneName :: Maybe (Value Text)
availabilityZoneName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       backupPolicy :: Maybe BackupPolicyProperty
backupPolicy = Maybe BackupPolicyProperty
forall a. Maybe a
Prelude.Nothing,
       bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
bypassPolicyLockoutSafetyCheck = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       encrypted :: Maybe (Value Bool)
encrypted = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing, fileSystemPolicy :: Maybe Object
fileSystemPolicy = Maybe Object
forall a. Maybe a
Prelude.Nothing,
       fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemProtection = Maybe FileSystemProtectionProperty
forall a. Maybe a
Prelude.Nothing,
       fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
fileSystemTags = Maybe [ElasticFileSystemTagProperty]
forall a. Maybe a
Prelude.Nothing, kmsKeyId :: Maybe (Value Text)
kmsKeyId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
lifecyclePolicies = Maybe [LifecyclePolicyProperty]
forall a. Maybe a
Prelude.Nothing,
       performanceMode :: Maybe (Value Text)
performanceMode = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       provisionedThroughputInMibps :: Maybe (Value Double)
provisionedThroughputInMibps = Maybe (Value Double)
forall a. Maybe a
Prelude.Nothing,
       replicationConfiguration :: Maybe ReplicationConfigurationProperty
replicationConfiguration = Maybe ReplicationConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
       throughputMode :: Maybe (Value Text)
throughputMode = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties FileSystem where
  toResourceProperties :: FileSystem -> ResourceProperties
toResourceProperties FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::EFS::FileSystem", supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                           [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
"AvailabilityZoneName" (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)
availabilityZoneName,
                            Key -> BackupPolicyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BackupPolicy" (BackupPolicyProperty -> (Key, Value))
-> Maybe BackupPolicyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BackupPolicyProperty
backupPolicy,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BypassPolicyLockoutSafetyCheck"
                              (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
bypassPolicyLockoutSafetyCheck,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Encrypted" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
encrypted,
                            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
"FileSystemPolicy" (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
fileSystemPolicy,
                            Key -> FileSystemProtectionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FileSystemProtection" (FileSystemProtectionProperty -> (Key, Value))
-> Maybe FileSystemProtectionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe FileSystemProtectionProperty
fileSystemProtection,
                            Key -> [ElasticFileSystemTagProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FileSystemTags" ([ElasticFileSystemTagProperty] -> (Key, Value))
-> Maybe [ElasticFileSystemTagProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ElasticFileSystemTagProperty]
fileSystemTags,
                            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
"KmsKeyId" (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)
kmsKeyId,
                            Key -> [LifecyclePolicyProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LifecyclePolicies" ([LifecyclePolicyProperty] -> (Key, Value))
-> Maybe [LifecyclePolicyProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [LifecyclePolicyProperty]
lifecyclePolicies,
                            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
"PerformanceMode" (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)
performanceMode,
                            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
"ProvisionedThroughputInMibps"
                              (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)
provisionedThroughputInMibps,
                            Key -> ReplicationConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ReplicationConfiguration"
                              (ReplicationConfigurationProperty -> (Key, Value))
-> Maybe ReplicationConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ReplicationConfigurationProperty
replicationConfiguration,
                            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
"ThroughputMode" (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)
throughputMode])}
instance JSON.ToJSON FileSystem where
  toJSON :: FileSystem -> Value
toJSON FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
              [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
"AvailabilityZoneName" (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)
availabilityZoneName,
               Key -> BackupPolicyProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BackupPolicy" (BackupPolicyProperty -> (Key, Value))
-> Maybe BackupPolicyProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BackupPolicyProperty
backupPolicy,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BypassPolicyLockoutSafetyCheck"
                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
bypassPolicyLockoutSafetyCheck,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Encrypted" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
encrypted,
               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
"FileSystemPolicy" (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
fileSystemPolicy,
               Key -> FileSystemProtectionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FileSystemProtection" (FileSystemProtectionProperty -> (Key, Value))
-> Maybe FileSystemProtectionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe FileSystemProtectionProperty
fileSystemProtection,
               Key -> [ElasticFileSystemTagProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FileSystemTags" ([ElasticFileSystemTagProperty] -> (Key, Value))
-> Maybe [ElasticFileSystemTagProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [ElasticFileSystemTagProperty]
fileSystemTags,
               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
"KmsKeyId" (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)
kmsKeyId,
               Key -> [LifecyclePolicyProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"LifecyclePolicies" ([LifecyclePolicyProperty] -> (Key, Value))
-> Maybe [LifecyclePolicyProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [LifecyclePolicyProperty]
lifecyclePolicies,
               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
"PerformanceMode" (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)
performanceMode,
               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
"ProvisionedThroughputInMibps"
                 (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)
provisionedThroughputInMibps,
               Key -> ReplicationConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ReplicationConfiguration"
                 (ReplicationConfigurationProperty -> (Key, Value))
-> Maybe ReplicationConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ReplicationConfigurationProperty
replicationConfiguration,
               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
"ThroughputMode" (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)
throughputMode]))
instance Property "AvailabilityZoneName" FileSystem where
  type PropertyType "AvailabilityZoneName" FileSystem = Value Prelude.Text
  set :: PropertyType "AvailabilityZoneName" FileSystem
-> FileSystem -> FileSystem
set PropertyType "AvailabilityZoneName" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {availabilityZoneName :: Maybe (Value Text)
availabilityZoneName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AvailabilityZoneName" FileSystem
Value Text
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "BackupPolicy" FileSystem where
  type PropertyType "BackupPolicy" FileSystem = BackupPolicyProperty
  set :: PropertyType "BackupPolicy" FileSystem -> FileSystem -> FileSystem
set PropertyType "BackupPolicy" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {backupPolicy :: Maybe BackupPolicyProperty
backupPolicy = BackupPolicyProperty -> Maybe BackupPolicyProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BackupPolicy" FileSystem
BackupPolicyProperty
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "BypassPolicyLockoutSafetyCheck" FileSystem where
  type PropertyType "BypassPolicyLockoutSafetyCheck" FileSystem = Value Prelude.Bool
  set :: PropertyType "BypassPolicyLockoutSafetyCheck" FileSystem
-> FileSystem -> FileSystem
set PropertyType "BypassPolicyLockoutSafetyCheck" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem
        {bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
bypassPolicyLockoutSafetyCheck = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BypassPolicyLockoutSafetyCheck" FileSystem
Value Bool
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "Encrypted" FileSystem where
  type PropertyType "Encrypted" FileSystem = Value Prelude.Bool
  set :: PropertyType "Encrypted" FileSystem -> FileSystem -> FileSystem
set PropertyType "Encrypted" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {encrypted :: Maybe (Value Bool)
encrypted = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Encrypted" FileSystem
Value Bool
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "FileSystemPolicy" FileSystem where
  type PropertyType "FileSystemPolicy" FileSystem = JSON.Object
  set :: PropertyType "FileSystemPolicy" FileSystem
-> FileSystem -> FileSystem
set PropertyType "FileSystemPolicy" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {fileSystemPolicy :: Maybe Object
fileSystemPolicy = Object -> Maybe Object
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Object
PropertyType "FileSystemPolicy" FileSystem
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "FileSystemProtection" FileSystem where
  type PropertyType "FileSystemProtection" FileSystem = FileSystemProtectionProperty
  set :: PropertyType "FileSystemProtection" FileSystem
-> FileSystem -> FileSystem
set PropertyType "FileSystemProtection" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemProtection = FileSystemProtectionProperty -> Maybe FileSystemProtectionProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "FileSystemProtection" FileSystem
FileSystemProtectionProperty
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "FileSystemTags" FileSystem where
  type PropertyType "FileSystemTags" FileSystem = [ElasticFileSystemTagProperty]
  set :: PropertyType "FileSystemTags" FileSystem
-> FileSystem -> FileSystem
set PropertyType "FileSystemTags" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
fileSystemTags = [ElasticFileSystemTagProperty]
-> Maybe [ElasticFileSystemTagProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [ElasticFileSystemTagProperty]
PropertyType "FileSystemTags" FileSystem
newValue, Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "KmsKeyId" FileSystem where
  type PropertyType "KmsKeyId" FileSystem = Value Prelude.Text
  set :: PropertyType "KmsKeyId" FileSystem -> FileSystem -> FileSystem
set PropertyType "KmsKeyId" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {kmsKeyId :: Maybe (Value Text)
kmsKeyId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KmsKeyId" FileSystem
Value Text
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "LifecyclePolicies" FileSystem where
  type PropertyType "LifecyclePolicies" FileSystem = [LifecyclePolicyProperty]
  set :: PropertyType "LifecyclePolicies" FileSystem
-> FileSystem -> FileSystem
set PropertyType "LifecyclePolicies" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
lifecyclePolicies = [LifecyclePolicyProperty] -> Maybe [LifecyclePolicyProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [LifecyclePolicyProperty]
PropertyType "LifecyclePolicies" FileSystem
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "PerformanceMode" FileSystem where
  type PropertyType "PerformanceMode" FileSystem = Value Prelude.Text
  set :: PropertyType "PerformanceMode" FileSystem
-> FileSystem -> FileSystem
set PropertyType "PerformanceMode" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {performanceMode :: Maybe (Value Text)
performanceMode = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PerformanceMode" FileSystem
Value Text
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "ProvisionedThroughputInMibps" FileSystem where
  type PropertyType "ProvisionedThroughputInMibps" FileSystem = Value Prelude.Double
  set :: PropertyType "ProvisionedThroughputInMibps" FileSystem
-> FileSystem -> FileSystem
set PropertyType "ProvisionedThroughputInMibps" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem
        {provisionedThroughputInMibps :: Maybe (Value Double)
provisionedThroughputInMibps = Value Double -> Maybe (Value Double)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ProvisionedThroughputInMibps" FileSystem
Value Double
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
instance Property "ReplicationConfiguration" FileSystem where
  type PropertyType "ReplicationConfiguration" FileSystem = ReplicationConfigurationProperty
  set :: PropertyType "ReplicationConfiguration" FileSystem
-> FileSystem -> FileSystem
set PropertyType "ReplicationConfiguration" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {replicationConfiguration :: Maybe ReplicationConfigurationProperty
replicationConfiguration = ReplicationConfigurationProperty
-> Maybe ReplicationConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ReplicationConfiguration" FileSystem
ReplicationConfigurationProperty
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
throughputMode :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
throughputMode :: Maybe (Value Text)
..}
instance Property "ThroughputMode" FileSystem where
  type PropertyType "ThroughputMode" FileSystem = Value Prelude.Text
  set :: PropertyType "ThroughputMode" FileSystem
-> FileSystem -> FileSystem
set PropertyType "ThroughputMode" FileSystem
newValue FileSystem {Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: FileSystem -> ()
availabilityZoneName :: FileSystem -> Maybe (Value Text)
backupPolicy :: FileSystem -> Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: FileSystem -> Maybe (Value Bool)
encrypted :: FileSystem -> Maybe (Value Bool)
fileSystemPolicy :: FileSystem -> Maybe Object
fileSystemProtection :: FileSystem -> Maybe FileSystemProtectionProperty
fileSystemTags :: FileSystem -> Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: FileSystem -> Maybe (Value Text)
lifecyclePolicies :: FileSystem -> Maybe [LifecyclePolicyProperty]
performanceMode :: FileSystem -> Maybe (Value Text)
provisionedThroughputInMibps :: FileSystem -> Maybe (Value Double)
replicationConfiguration :: FileSystem -> Maybe ReplicationConfigurationProperty
throughputMode :: FileSystem -> Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
throughputMode :: Maybe (Value Text)
..}
    = FileSystem {throughputMode :: Maybe (Value Text)
throughputMode = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ThroughputMode" FileSystem
Value Text
newValue, Maybe [ElasticFileSystemTagProperty]
Maybe [LifecyclePolicyProperty]
Maybe Object
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe BackupPolicyProperty
Maybe FileSystemProtectionProperty
Maybe ReplicationConfigurationProperty
()
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
haddock_workaround_ :: ()
availabilityZoneName :: Maybe (Value Text)
backupPolicy :: Maybe BackupPolicyProperty
bypassPolicyLockoutSafetyCheck :: Maybe (Value Bool)
encrypted :: Maybe (Value Bool)
fileSystemPolicy :: Maybe Object
fileSystemProtection :: Maybe FileSystemProtectionProperty
fileSystemTags :: Maybe [ElasticFileSystemTagProperty]
kmsKeyId :: Maybe (Value Text)
lifecyclePolicies :: Maybe [LifecyclePolicyProperty]
performanceMode :: Maybe (Value Text)
provisionedThroughputInMibps :: Maybe (Value Double)
replicationConfiguration :: Maybe ReplicationConfigurationProperty
..}