module Stratosphere.FSx.FileSystem.LustreConfigurationProperty (
        module Exports, LustreConfigurationProperty(..),
        mkLustreConfigurationProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.FSx.FileSystem.DataReadCacheConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.FSx.FileSystem.MetadataConfigurationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data LustreConfigurationProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html>
    LustreConfigurationProperty {LustreConfigurationProperty -> ()
haddock_workaround_ :: (),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-autoimportpolicy>
                                 LustreConfigurationProperty -> Maybe (Value Text)
autoImportPolicy :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-automaticbackupretentiondays>
                                 LustreConfigurationProperty -> Maybe (Value Integer)
automaticBackupRetentionDays :: (Prelude.Maybe (Value Prelude.Integer)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-copytagstobackups>
                                 LustreConfigurationProperty -> Maybe (Value Bool)
copyTagsToBackups :: (Prelude.Maybe (Value Prelude.Bool)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-dailyautomaticbackupstarttime>
                                 LustreConfigurationProperty -> Maybe (Value Text)
dailyAutomaticBackupStartTime :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-datacompressiontype>
                                 LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-datareadcacheconfiguration>
                                 LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
dataReadCacheConfiguration :: (Prelude.Maybe DataReadCacheConfigurationProperty),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-deploymenttype>
                                 LustreConfigurationProperty -> Maybe (Value Text)
deploymentType :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-drivecachetype>
                                 LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-efaenabled>
                                 LustreConfigurationProperty -> Maybe (Value Bool)
efaEnabled :: (Prelude.Maybe (Value Prelude.Bool)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-exportpath>
                                 LustreConfigurationProperty -> Maybe (Value Text)
exportPath :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-importpath>
                                 LustreConfigurationProperty -> Maybe (Value Text)
importPath :: (Prelude.Maybe (Value Prelude.Text)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-importedfilechunksize>
                                 LustreConfigurationProperty -> Maybe (Value Integer)
importedFileChunkSize :: (Prelude.Maybe (Value Prelude.Integer)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-metadataconfiguration>
                                 LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
metadataConfiguration :: (Prelude.Maybe MetadataConfigurationProperty),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-perunitstoragethroughput>
                                 LustreConfigurationProperty -> Maybe (Value Integer)
perUnitStorageThroughput :: (Prelude.Maybe (Value Prelude.Integer)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-throughputcapacity>
                                 LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: (Prelude.Maybe (Value Prelude.Integer)),
                                 -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-fsx-filesystem-lustreconfiguration.html#cfn-fsx-filesystem-lustreconfiguration-weeklymaintenancestarttime>
                                 LustreConfigurationProperty -> Maybe (Value Text)
weeklyMaintenanceStartTime :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (LustreConfigurationProperty -> LustreConfigurationProperty -> Bool
(LustreConfigurationProperty
 -> LustreConfigurationProperty -> Bool)
-> (LustreConfigurationProperty
    -> LustreConfigurationProperty -> Bool)
-> Eq LustreConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: LustreConfigurationProperty -> LustreConfigurationProperty -> Bool
== :: LustreConfigurationProperty -> LustreConfigurationProperty -> Bool
$c/= :: LustreConfigurationProperty -> LustreConfigurationProperty -> Bool
/= :: LustreConfigurationProperty -> LustreConfigurationProperty -> Bool
Prelude.Eq, Int -> LustreConfigurationProperty -> ShowS
[LustreConfigurationProperty] -> ShowS
LustreConfigurationProperty -> String
(Int -> LustreConfigurationProperty -> ShowS)
-> (LustreConfigurationProperty -> String)
-> ([LustreConfigurationProperty] -> ShowS)
-> Show LustreConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> LustreConfigurationProperty -> ShowS
showsPrec :: Int -> LustreConfigurationProperty -> ShowS
$cshow :: LustreConfigurationProperty -> String
show :: LustreConfigurationProperty -> String
$cshowList :: [LustreConfigurationProperty] -> ShowS
showList :: [LustreConfigurationProperty] -> ShowS
Prelude.Show)
mkLustreConfigurationProperty :: LustreConfigurationProperty
mkLustreConfigurationProperty :: LustreConfigurationProperty
mkLustreConfigurationProperty
  = LustreConfigurationProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), autoImportPolicy :: Maybe (Value Text)
autoImportPolicy = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       automaticBackupRetentionDays :: Maybe (Value Integer)
automaticBackupRetentionDays = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       copyTagsToBackups :: Maybe (Value Bool)
copyTagsToBackups = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       dailyAutomaticBackupStartTime :: Maybe (Value Text)
dailyAutomaticBackupStartTime = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       dataCompressionType :: Maybe (Value Text)
dataCompressionType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
dataReadCacheConfiguration = Maybe DataReadCacheConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
       deploymentType :: Maybe (Value Text)
deploymentType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, driveCacheType :: Maybe (Value Text)
driveCacheType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       efaEnabled :: Maybe (Value Bool)
efaEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing, exportPath :: Maybe (Value Text)
exportPath = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       importPath :: Maybe (Value Text)
importPath = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       importedFileChunkSize :: Maybe (Value Integer)
importedFileChunkSize = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       metadataConfiguration :: Maybe MetadataConfigurationProperty
metadataConfiguration = Maybe MetadataConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
       perUnitStorageThroughput :: Maybe (Value Integer)
perUnitStorageThroughput = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       throughputCapacity :: Maybe (Value Integer)
throughputCapacity = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       weeklyMaintenanceStartTime :: Maybe (Value Text)
weeklyMaintenanceStartTime = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties LustreConfigurationProperty where
  toResourceProperties :: LustreConfigurationProperty -> ResourceProperties
toResourceProperties LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::FSx::FileSystem.LustreConfiguration",
         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
"AutoImportPolicy" (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)
autoImportPolicy,
                            Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutomaticBackupRetentionDays"
                              (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
automaticBackupRetentionDays,
                            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
"CopyTagsToBackups" (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)
copyTagsToBackups,
                            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
"DailyAutomaticBackupStartTime"
                              (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)
dailyAutomaticBackupStartTime,
                            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
"DataCompressionType" (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)
dataCompressionType,
                            Key -> DataReadCacheConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DataReadCacheConfiguration"
                              (DataReadCacheConfigurationProperty -> (Key, Value))
-> Maybe DataReadCacheConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DataReadCacheConfigurationProperty
dataReadCacheConfiguration,
                            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
"DeploymentType" (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)
deploymentType,
                            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
"DriveCacheType" (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)
driveCacheType,
                            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
"EfaEnabled" (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)
efaEnabled,
                            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
"ExportPath" (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)
exportPath,
                            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
"ImportPath" (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)
importPath,
                            Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ImportedFileChunkSize"
                              (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
importedFileChunkSize,
                            Key -> MetadataConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MetadataConfiguration"
                              (MetadataConfigurationProperty -> (Key, Value))
-> Maybe MetadataConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MetadataConfigurationProperty
metadataConfiguration,
                            Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PerUnitStorageThroughput"
                              (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
perUnitStorageThroughput,
                            Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ThroughputCapacity" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
throughputCapacity,
                            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
"WeeklyMaintenanceStartTime"
                              (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)
weeklyMaintenanceStartTime])}
instance JSON.ToJSON LustreConfigurationProperty where
  toJSON :: LustreConfigurationProperty -> Value
toJSON LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: 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
"AutoImportPolicy" (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)
autoImportPolicy,
               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutomaticBackupRetentionDays"
                 (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
automaticBackupRetentionDays,
               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
"CopyTagsToBackups" (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)
copyTagsToBackups,
               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
"DailyAutomaticBackupStartTime"
                 (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)
dailyAutomaticBackupStartTime,
               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
"DataCompressionType" (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)
dataCompressionType,
               Key -> DataReadCacheConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DataReadCacheConfiguration"
                 (DataReadCacheConfigurationProperty -> (Key, Value))
-> Maybe DataReadCacheConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DataReadCacheConfigurationProperty
dataReadCacheConfiguration,
               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
"DeploymentType" (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)
deploymentType,
               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
"DriveCacheType" (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)
driveCacheType,
               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
"EfaEnabled" (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)
efaEnabled,
               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
"ExportPath" (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)
exportPath,
               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
"ImportPath" (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)
importPath,
               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ImportedFileChunkSize"
                 (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
importedFileChunkSize,
               Key -> MetadataConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MetadataConfiguration"
                 (MetadataConfigurationProperty -> (Key, Value))
-> Maybe MetadataConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MetadataConfigurationProperty
metadataConfiguration,
               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PerUnitStorageThroughput"
                 (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
perUnitStorageThroughput,
               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ThroughputCapacity" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
throughputCapacity,
               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
"WeeklyMaintenanceStartTime"
                 (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)
weeklyMaintenanceStartTime]))
instance Property "AutoImportPolicy" LustreConfigurationProperty where
  type PropertyType "AutoImportPolicy" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType "AutoImportPolicy" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "AutoImportPolicy" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {autoImportPolicy :: Maybe (Value Text)
autoImportPolicy = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AutoImportPolicy" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "AutomaticBackupRetentionDays" LustreConfigurationProperty where
  type PropertyType "AutomaticBackupRetentionDays" LustreConfigurationProperty = Value Prelude.Integer
  set :: PropertyType
  "AutomaticBackupRetentionDays" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType
  "AutomaticBackupRetentionDays" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {automaticBackupRetentionDays :: Maybe (Value Integer)
automaticBackupRetentionDays = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "AutomaticBackupRetentionDays" LustreConfigurationProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "CopyTagsToBackups" LustreConfigurationProperty where
  type PropertyType "CopyTagsToBackups" LustreConfigurationProperty = Value Prelude.Bool
  set :: PropertyType "CopyTagsToBackups" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "CopyTagsToBackups" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {copyTagsToBackups :: Maybe (Value Bool)
copyTagsToBackups = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CopyTagsToBackups" LustreConfigurationProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "DailyAutomaticBackupStartTime" LustreConfigurationProperty where
  type PropertyType "DailyAutomaticBackupStartTime" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType
  "DailyAutomaticBackupStartTime" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType
  "DailyAutomaticBackupStartTime" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {dailyAutomaticBackupStartTime :: Maybe (Value Text)
dailyAutomaticBackupStartTime = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "DailyAutomaticBackupStartTime" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "DataCompressionType" LustreConfigurationProperty where
  type PropertyType "DataCompressionType" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType "DataCompressionType" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "DataCompressionType" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {dataCompressionType :: Maybe (Value Text)
dataCompressionType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DataCompressionType" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "DataReadCacheConfiguration" LustreConfigurationProperty where
  type PropertyType "DataReadCacheConfiguration" LustreConfigurationProperty = DataReadCacheConfigurationProperty
  set :: PropertyType
  "DataReadCacheConfiguration" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType
  "DataReadCacheConfiguration" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
dataReadCacheConfiguration = DataReadCacheConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "DataReadCacheConfiguration" LustreConfigurationProperty
DataReadCacheConfigurationProperty
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "DeploymentType" LustreConfigurationProperty where
  type PropertyType "DeploymentType" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType "DeploymentType" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "DeploymentType" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {deploymentType :: Maybe (Value Text)
deploymentType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DeploymentType" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "DriveCacheType" LustreConfigurationProperty where
  type PropertyType "DriveCacheType" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType "DriveCacheType" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "DriveCacheType" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {driveCacheType :: Maybe (Value Text)
driveCacheType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DriveCacheType" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "EfaEnabled" LustreConfigurationProperty where
  type PropertyType "EfaEnabled" LustreConfigurationProperty = Value Prelude.Bool
  set :: PropertyType "EfaEnabled" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "EfaEnabled" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {efaEnabled :: Maybe (Value Bool)
efaEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EfaEnabled" LustreConfigurationProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "ExportPath" LustreConfigurationProperty where
  type PropertyType "ExportPath" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType "ExportPath" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "ExportPath" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {exportPath :: Maybe (Value Text)
exportPath = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ExportPath" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "ImportPath" LustreConfigurationProperty where
  type PropertyType "ImportPath" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType "ImportPath" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "ImportPath" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {importPath :: Maybe (Value Text)
importPath = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ImportPath" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "ImportedFileChunkSize" LustreConfigurationProperty where
  type PropertyType "ImportedFileChunkSize" LustreConfigurationProperty = Value Prelude.Integer
  set :: PropertyType "ImportedFileChunkSize" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "ImportedFileChunkSize" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {importedFileChunkSize :: Maybe (Value Integer)
importedFileChunkSize = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ImportedFileChunkSize" LustreConfigurationProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "MetadataConfiguration" LustreConfigurationProperty where
  type PropertyType "MetadataConfiguration" LustreConfigurationProperty = MetadataConfigurationProperty
  set :: PropertyType "MetadataConfiguration" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "MetadataConfiguration" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {metadataConfiguration :: Maybe MetadataConfigurationProperty
metadataConfiguration = MetadataConfigurationProperty
-> Maybe MetadataConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MetadataConfiguration" LustreConfigurationProperty
MetadataConfigurationProperty
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "PerUnitStorageThroughput" LustreConfigurationProperty where
  type PropertyType "PerUnitStorageThroughput" LustreConfigurationProperty = Value Prelude.Integer
  set :: PropertyType "PerUnitStorageThroughput" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "PerUnitStorageThroughput" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {perUnitStorageThroughput :: Maybe (Value Integer)
perUnitStorageThroughput = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PerUnitStorageThroughput" LustreConfigurationProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "ThroughputCapacity" LustreConfigurationProperty where
  type PropertyType "ThroughputCapacity" LustreConfigurationProperty = Value Prelude.Integer
  set :: PropertyType "ThroughputCapacity" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType "ThroughputCapacity" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {throughputCapacity :: Maybe (Value Integer)
throughputCapacity = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ThroughputCapacity" LustreConfigurationProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
instance Property "WeeklyMaintenanceStartTime" LustreConfigurationProperty where
  type PropertyType "WeeklyMaintenanceStartTime" LustreConfigurationProperty = Value Prelude.Text
  set :: PropertyType
  "WeeklyMaintenanceStartTime" LustreConfigurationProperty
-> LustreConfigurationProperty -> LustreConfigurationProperty
set PropertyType
  "WeeklyMaintenanceStartTime" LustreConfigurationProperty
newValue LustreConfigurationProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: LustreConfigurationProperty -> ()
autoImportPolicy :: LustreConfigurationProperty -> Maybe (Value Text)
automaticBackupRetentionDays :: LustreConfigurationProperty -> Maybe (Value Integer)
copyTagsToBackups :: LustreConfigurationProperty -> Maybe (Value Bool)
dailyAutomaticBackupStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
dataCompressionType :: LustreConfigurationProperty -> Maybe (Value Text)
dataReadCacheConfiguration :: LustreConfigurationProperty
-> Maybe DataReadCacheConfigurationProperty
deploymentType :: LustreConfigurationProperty -> Maybe (Value Text)
driveCacheType :: LustreConfigurationProperty -> Maybe (Value Text)
efaEnabled :: LustreConfigurationProperty -> Maybe (Value Bool)
exportPath :: LustreConfigurationProperty -> Maybe (Value Text)
importPath :: LustreConfigurationProperty -> Maybe (Value Text)
importedFileChunkSize :: LustreConfigurationProperty -> Maybe (Value Integer)
metadataConfiguration :: LustreConfigurationProperty -> Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: LustreConfigurationProperty -> Maybe (Value Integer)
throughputCapacity :: LustreConfigurationProperty -> Maybe (Value Integer)
weeklyMaintenanceStartTime :: LustreConfigurationProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
weeklyMaintenanceStartTime :: Maybe (Value Text)
..}
    = LustreConfigurationProperty
        {weeklyMaintenanceStartTime :: Maybe (Value Text)
weeklyMaintenanceStartTime = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "WeeklyMaintenanceStartTime" LustreConfigurationProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe DataReadCacheConfigurationProperty
Maybe MetadataConfigurationProperty
()
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
haddock_workaround_ :: ()
autoImportPolicy :: Maybe (Value Text)
automaticBackupRetentionDays :: Maybe (Value Integer)
copyTagsToBackups :: Maybe (Value Bool)
dailyAutomaticBackupStartTime :: Maybe (Value Text)
dataCompressionType :: Maybe (Value Text)
dataReadCacheConfiguration :: Maybe DataReadCacheConfigurationProperty
deploymentType :: Maybe (Value Text)
driveCacheType :: Maybe (Value Text)
efaEnabled :: Maybe (Value Bool)
exportPath :: Maybe (Value Text)
importPath :: Maybe (Value Text)
importedFileChunkSize :: Maybe (Value Integer)
metadataConfiguration :: Maybe MetadataConfigurationProperty
perUnitStorageThroughput :: Maybe (Value Integer)
throughputCapacity :: Maybe (Value Integer)
..}