{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.FSx.Types.CreateFileSystemOpenZFSConfiguration
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.FSx.Types.CreateFileSystemOpenZFSConfiguration where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.FSx.Types.DiskIopsConfiguration
import Amazonka.FSx.Types.OpenZFSCreateRootVolumeConfiguration
import Amazonka.FSx.Types.OpenZFSDeploymentType
import qualified Amazonka.Prelude as Prelude

-- | The Amazon FSx for OpenZFS configuration properties for the file system
-- that you are creating.
--
-- /See:/ 'newCreateFileSystemOpenZFSConfiguration' smart constructor.
data CreateFileSystemOpenZFSConfiguration = CreateFileSystemOpenZFSConfiguration'
  { CreateFileSystemOpenZFSConfiguration -> Maybe Natural
automaticBackupRetentionDays :: Prelude.Maybe Prelude.Natural,
    -- | A Boolean value indicating whether tags for the file system should be
    -- copied to backups. This value defaults to @false@. If it\'s set to
    -- @true@, all tags for the file system are copied to all automatic and
    -- user-initiated backups where the user doesn\'t specify tags. If this
    -- value is @true@, and you specify one or more tags, only the specified
    -- tags are copied to backups. If you specify one or more tags when
    -- creating a user-initiated backup, no tags are copied from the file
    -- system, regardless of this value.
    CreateFileSystemOpenZFSConfiguration -> Maybe Bool
copyTagsToBackups :: Prelude.Maybe Prelude.Bool,
    -- | A Boolean value indicating whether tags for the file system should be
    -- copied to volumes. This value defaults to @false@. If it\'s set to
    -- @true@, all tags for the file system are copied to volumes where the
    -- user doesn\'t specify tags. If this value is @true@, and you specify one
    -- or more tags, only the specified tags are copied to volumes. If you
    -- specify one or more tags when creating the volume, no tags are copied
    -- from the file system, regardless of this value.
    CreateFileSystemOpenZFSConfiguration -> Maybe Bool
copyTagsToVolumes :: Prelude.Maybe Prelude.Bool,
    CreateFileSystemOpenZFSConfiguration -> Maybe Text
dailyAutomaticBackupStartTime :: Prelude.Maybe Prelude.Text,
    CreateFileSystemOpenZFSConfiguration -> Maybe DiskIopsConfiguration
diskIopsConfiguration :: Prelude.Maybe DiskIopsConfiguration,
    -- | The configuration Amazon FSx uses when creating the root value of the
    -- Amazon FSx for OpenZFS file system. All volumes are children of the root
    -- volume.
    CreateFileSystemOpenZFSConfiguration
-> Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration :: Prelude.Maybe OpenZFSCreateRootVolumeConfiguration,
    CreateFileSystemOpenZFSConfiguration -> Maybe Text
weeklyMaintenanceStartTime :: Prelude.Maybe Prelude.Text,
    -- | Specifies the file system deployment type. Single AZ deployment types
    -- are configured for redundancy within a single Availability Zone in an
    -- Amazon Web Services Region . Valid values are the following:
    --
    -- -   @SINGLE_AZ_1@- (Default) Creates file systems with throughput
    --     capacities of 64 - 4,096 MB\/s. @Single_AZ_1@ is available in all
    --     Amazon Web Services Regions where Amazon FSx for OpenZFS is
    --     available, except US West (Oregon).
    --
    -- -   @SINGLE_AZ_2@- Creates file systems with throughput capacities of
    --     160 - 10,240 MB\/s using an NVMe L2ARC cache. @Single_AZ_2@ is
    --     available only in the US East (N. Virginia), US East (Ohio), US West
    --     (Oregon), and Europe (Ireland) Amazon Web Services Regions.
    --
    -- For more information, see:
    -- <https://docs.aws.amazon.com/fsx/latest/OpenZFSGuide/availability-durability.html#available-aws-regions Deployment type availability>
    -- and
    -- <https://docs.aws.amazon.com/fsx/latest/OpenZFSGuide/performance.html#zfs-fs-performance File system performance>
    -- in the /Amazon FSx for OpenZFS User Guide/.
    CreateFileSystemOpenZFSConfiguration -> OpenZFSDeploymentType
deploymentType :: OpenZFSDeploymentType,
    -- | Specifies the throughput of an Amazon FSx for OpenZFS file system,
    -- measured in megabytes per second (MB\/s). Valid values depend on the
    -- DeploymentType you choose, as follows:
    --
    -- -   For @SINGLE_AZ_1@, valid values are 64, 128, 256, 512, 1024, 2048,
    --     3072, or 4096 MB\/s.
    --
    -- -   For @SINGLE_AZ_2@, valid values are 160, 320, 640, 1280, 2560, 3840,
    --     5120, 7680, or 10240 MB\/s.
    --
    -- You pay for additional throughput capacity that you provision.
    CreateFileSystemOpenZFSConfiguration -> Natural
throughputCapacity :: Prelude.Natural
  }
  deriving (CreateFileSystemOpenZFSConfiguration
-> CreateFileSystemOpenZFSConfiguration -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateFileSystemOpenZFSConfiguration
-> CreateFileSystemOpenZFSConfiguration -> Bool
$c/= :: CreateFileSystemOpenZFSConfiguration
-> CreateFileSystemOpenZFSConfiguration -> Bool
== :: CreateFileSystemOpenZFSConfiguration
-> CreateFileSystemOpenZFSConfiguration -> Bool
$c== :: CreateFileSystemOpenZFSConfiguration
-> CreateFileSystemOpenZFSConfiguration -> Bool
Prelude.Eq, ReadPrec [CreateFileSystemOpenZFSConfiguration]
ReadPrec CreateFileSystemOpenZFSConfiguration
Int -> ReadS CreateFileSystemOpenZFSConfiguration
ReadS [CreateFileSystemOpenZFSConfiguration]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateFileSystemOpenZFSConfiguration]
$creadListPrec :: ReadPrec [CreateFileSystemOpenZFSConfiguration]
readPrec :: ReadPrec CreateFileSystemOpenZFSConfiguration
$creadPrec :: ReadPrec CreateFileSystemOpenZFSConfiguration
readList :: ReadS [CreateFileSystemOpenZFSConfiguration]
$creadList :: ReadS [CreateFileSystemOpenZFSConfiguration]
readsPrec :: Int -> ReadS CreateFileSystemOpenZFSConfiguration
$creadsPrec :: Int -> ReadS CreateFileSystemOpenZFSConfiguration
Prelude.Read, Int -> CreateFileSystemOpenZFSConfiguration -> ShowS
[CreateFileSystemOpenZFSConfiguration] -> ShowS
CreateFileSystemOpenZFSConfiguration -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateFileSystemOpenZFSConfiguration] -> ShowS
$cshowList :: [CreateFileSystemOpenZFSConfiguration] -> ShowS
show :: CreateFileSystemOpenZFSConfiguration -> String
$cshow :: CreateFileSystemOpenZFSConfiguration -> String
showsPrec :: Int -> CreateFileSystemOpenZFSConfiguration -> ShowS
$cshowsPrec :: Int -> CreateFileSystemOpenZFSConfiguration -> ShowS
Prelude.Show, forall x.
Rep CreateFileSystemOpenZFSConfiguration x
-> CreateFileSystemOpenZFSConfiguration
forall x.
CreateFileSystemOpenZFSConfiguration
-> Rep CreateFileSystemOpenZFSConfiguration x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep CreateFileSystemOpenZFSConfiguration x
-> CreateFileSystemOpenZFSConfiguration
$cfrom :: forall x.
CreateFileSystemOpenZFSConfiguration
-> Rep CreateFileSystemOpenZFSConfiguration x
Prelude.Generic)

-- |
-- Create a value of 'CreateFileSystemOpenZFSConfiguration' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'automaticBackupRetentionDays', 'createFileSystemOpenZFSConfiguration_automaticBackupRetentionDays' - Undocumented member.
--
-- 'copyTagsToBackups', 'createFileSystemOpenZFSConfiguration_copyTagsToBackups' - A Boolean value indicating whether tags for the file system should be
-- copied to backups. This value defaults to @false@. If it\'s set to
-- @true@, all tags for the file system are copied to all automatic and
-- user-initiated backups where the user doesn\'t specify tags. If this
-- value is @true@, and you specify one or more tags, only the specified
-- tags are copied to backups. If you specify one or more tags when
-- creating a user-initiated backup, no tags are copied from the file
-- system, regardless of this value.
--
-- 'copyTagsToVolumes', 'createFileSystemOpenZFSConfiguration_copyTagsToVolumes' - A Boolean value indicating whether tags for the file system should be
-- copied to volumes. This value defaults to @false@. If it\'s set to
-- @true@, all tags for the file system are copied to volumes where the
-- user doesn\'t specify tags. If this value is @true@, and you specify one
-- or more tags, only the specified tags are copied to volumes. If you
-- specify one or more tags when creating the volume, no tags are copied
-- from the file system, regardless of this value.
--
-- 'dailyAutomaticBackupStartTime', 'createFileSystemOpenZFSConfiguration_dailyAutomaticBackupStartTime' - Undocumented member.
--
-- 'diskIopsConfiguration', 'createFileSystemOpenZFSConfiguration_diskIopsConfiguration' - Undocumented member.
--
-- 'rootVolumeConfiguration', 'createFileSystemOpenZFSConfiguration_rootVolumeConfiguration' - The configuration Amazon FSx uses when creating the root value of the
-- Amazon FSx for OpenZFS file system. All volumes are children of the root
-- volume.
--
-- 'weeklyMaintenanceStartTime', 'createFileSystemOpenZFSConfiguration_weeklyMaintenanceStartTime' - Undocumented member.
--
-- 'deploymentType', 'createFileSystemOpenZFSConfiguration_deploymentType' - Specifies the file system deployment type. Single AZ deployment types
-- are configured for redundancy within a single Availability Zone in an
-- Amazon Web Services Region . Valid values are the following:
--
-- -   @SINGLE_AZ_1@- (Default) Creates file systems with throughput
--     capacities of 64 - 4,096 MB\/s. @Single_AZ_1@ is available in all
--     Amazon Web Services Regions where Amazon FSx for OpenZFS is
--     available, except US West (Oregon).
--
-- -   @SINGLE_AZ_2@- Creates file systems with throughput capacities of
--     160 - 10,240 MB\/s using an NVMe L2ARC cache. @Single_AZ_2@ is
--     available only in the US East (N. Virginia), US East (Ohio), US West
--     (Oregon), and Europe (Ireland) Amazon Web Services Regions.
--
-- For more information, see:
-- <https://docs.aws.amazon.com/fsx/latest/OpenZFSGuide/availability-durability.html#available-aws-regions Deployment type availability>
-- and
-- <https://docs.aws.amazon.com/fsx/latest/OpenZFSGuide/performance.html#zfs-fs-performance File system performance>
-- in the /Amazon FSx for OpenZFS User Guide/.
--
-- 'throughputCapacity', 'createFileSystemOpenZFSConfiguration_throughputCapacity' - Specifies the throughput of an Amazon FSx for OpenZFS file system,
-- measured in megabytes per second (MB\/s). Valid values depend on the
-- DeploymentType you choose, as follows:
--
-- -   For @SINGLE_AZ_1@, valid values are 64, 128, 256, 512, 1024, 2048,
--     3072, or 4096 MB\/s.
--
-- -   For @SINGLE_AZ_2@, valid values are 160, 320, 640, 1280, 2560, 3840,
--     5120, 7680, or 10240 MB\/s.
--
-- You pay for additional throughput capacity that you provision.
newCreateFileSystemOpenZFSConfiguration ::
  -- | 'deploymentType'
  OpenZFSDeploymentType ->
  -- | 'throughputCapacity'
  Prelude.Natural ->
  CreateFileSystemOpenZFSConfiguration
newCreateFileSystemOpenZFSConfiguration :: OpenZFSDeploymentType
-> Natural -> CreateFileSystemOpenZFSConfiguration
newCreateFileSystemOpenZFSConfiguration
  OpenZFSDeploymentType
pDeploymentType_
  Natural
pThroughputCapacity_ =
    CreateFileSystemOpenZFSConfiguration'
      { $sel:automaticBackupRetentionDays:CreateFileSystemOpenZFSConfiguration' :: Maybe Natural
automaticBackupRetentionDays =
          forall a. Maybe a
Prelude.Nothing,
        $sel:copyTagsToBackups:CreateFileSystemOpenZFSConfiguration' :: Maybe Bool
copyTagsToBackups = forall a. Maybe a
Prelude.Nothing,
        $sel:copyTagsToVolumes:CreateFileSystemOpenZFSConfiguration' :: Maybe Bool
copyTagsToVolumes = forall a. Maybe a
Prelude.Nothing,
        $sel:dailyAutomaticBackupStartTime:CreateFileSystemOpenZFSConfiguration' :: Maybe Text
dailyAutomaticBackupStartTime =
          forall a. Maybe a
Prelude.Nothing,
        $sel:diskIopsConfiguration:CreateFileSystemOpenZFSConfiguration' :: Maybe DiskIopsConfiguration
diskIopsConfiguration =
          forall a. Maybe a
Prelude.Nothing,
        $sel:rootVolumeConfiguration:CreateFileSystemOpenZFSConfiguration' :: Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration =
          forall a. Maybe a
Prelude.Nothing,
        $sel:weeklyMaintenanceStartTime:CreateFileSystemOpenZFSConfiguration' :: Maybe Text
weeklyMaintenanceStartTime =
          forall a. Maybe a
Prelude.Nothing,
        $sel:deploymentType:CreateFileSystemOpenZFSConfiguration' :: OpenZFSDeploymentType
deploymentType = OpenZFSDeploymentType
pDeploymentType_,
        $sel:throughputCapacity:CreateFileSystemOpenZFSConfiguration' :: Natural
throughputCapacity =
          Natural
pThroughputCapacity_
      }

-- | Undocumented member.
createFileSystemOpenZFSConfiguration_automaticBackupRetentionDays :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe Prelude.Natural)
createFileSystemOpenZFSConfiguration_automaticBackupRetentionDays :: Lens' CreateFileSystemOpenZFSConfiguration (Maybe Natural)
createFileSystemOpenZFSConfiguration_automaticBackupRetentionDays = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe Natural
automaticBackupRetentionDays :: Maybe Natural
$sel:automaticBackupRetentionDays:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Natural
automaticBackupRetentionDays} -> Maybe Natural
automaticBackupRetentionDays) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe Natural
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:automaticBackupRetentionDays:CreateFileSystemOpenZFSConfiguration' :: Maybe Natural
automaticBackupRetentionDays = Maybe Natural
a} :: CreateFileSystemOpenZFSConfiguration)

-- | A Boolean value indicating whether tags for the file system should be
-- copied to backups. This value defaults to @false@. If it\'s set to
-- @true@, all tags for the file system are copied to all automatic and
-- user-initiated backups where the user doesn\'t specify tags. If this
-- value is @true@, and you specify one or more tags, only the specified
-- tags are copied to backups. If you specify one or more tags when
-- creating a user-initiated backup, no tags are copied from the file
-- system, regardless of this value.
createFileSystemOpenZFSConfiguration_copyTagsToBackups :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe Prelude.Bool)
createFileSystemOpenZFSConfiguration_copyTagsToBackups :: Lens' CreateFileSystemOpenZFSConfiguration (Maybe Bool)
createFileSystemOpenZFSConfiguration_copyTagsToBackups = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe Bool
copyTagsToBackups :: Maybe Bool
$sel:copyTagsToBackups:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
copyTagsToBackups} -> Maybe Bool
copyTagsToBackups) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe Bool
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:copyTagsToBackups:CreateFileSystemOpenZFSConfiguration' :: Maybe Bool
copyTagsToBackups = Maybe Bool
a} :: CreateFileSystemOpenZFSConfiguration)

-- | A Boolean value indicating whether tags for the file system should be
-- copied to volumes. This value defaults to @false@. If it\'s set to
-- @true@, all tags for the file system are copied to volumes where the
-- user doesn\'t specify tags. If this value is @true@, and you specify one
-- or more tags, only the specified tags are copied to volumes. If you
-- specify one or more tags when creating the volume, no tags are copied
-- from the file system, regardless of this value.
createFileSystemOpenZFSConfiguration_copyTagsToVolumes :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe Prelude.Bool)
createFileSystemOpenZFSConfiguration_copyTagsToVolumes :: Lens' CreateFileSystemOpenZFSConfiguration (Maybe Bool)
createFileSystemOpenZFSConfiguration_copyTagsToVolumes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe Bool
copyTagsToVolumes :: Maybe Bool
$sel:copyTagsToVolumes:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
copyTagsToVolumes} -> Maybe Bool
copyTagsToVolumes) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe Bool
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:copyTagsToVolumes:CreateFileSystemOpenZFSConfiguration' :: Maybe Bool
copyTagsToVolumes = Maybe Bool
a} :: CreateFileSystemOpenZFSConfiguration)

-- | Undocumented member.
createFileSystemOpenZFSConfiguration_dailyAutomaticBackupStartTime :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe Prelude.Text)
createFileSystemOpenZFSConfiguration_dailyAutomaticBackupStartTime :: Lens' CreateFileSystemOpenZFSConfiguration (Maybe Text)
createFileSystemOpenZFSConfiguration_dailyAutomaticBackupStartTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe Text
dailyAutomaticBackupStartTime :: Maybe Text
$sel:dailyAutomaticBackupStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
dailyAutomaticBackupStartTime} -> Maybe Text
dailyAutomaticBackupStartTime) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe Text
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:dailyAutomaticBackupStartTime:CreateFileSystemOpenZFSConfiguration' :: Maybe Text
dailyAutomaticBackupStartTime = Maybe Text
a} :: CreateFileSystemOpenZFSConfiguration)

-- | Undocumented member.
createFileSystemOpenZFSConfiguration_diskIopsConfiguration :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe DiskIopsConfiguration)
createFileSystemOpenZFSConfiguration_diskIopsConfiguration :: Lens'
  CreateFileSystemOpenZFSConfiguration (Maybe DiskIopsConfiguration)
createFileSystemOpenZFSConfiguration_diskIopsConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe DiskIopsConfiguration
diskIopsConfiguration :: Maybe DiskIopsConfiguration
$sel:diskIopsConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe DiskIopsConfiguration
diskIopsConfiguration} -> Maybe DiskIopsConfiguration
diskIopsConfiguration) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe DiskIopsConfiguration
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:diskIopsConfiguration:CreateFileSystemOpenZFSConfiguration' :: Maybe DiskIopsConfiguration
diskIopsConfiguration = Maybe DiskIopsConfiguration
a} :: CreateFileSystemOpenZFSConfiguration)

-- | The configuration Amazon FSx uses when creating the root value of the
-- Amazon FSx for OpenZFS file system. All volumes are children of the root
-- volume.
createFileSystemOpenZFSConfiguration_rootVolumeConfiguration :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe OpenZFSCreateRootVolumeConfiguration)
createFileSystemOpenZFSConfiguration_rootVolumeConfiguration :: Lens'
  CreateFileSystemOpenZFSConfiguration
  (Maybe OpenZFSCreateRootVolumeConfiguration)
createFileSystemOpenZFSConfiguration_rootVolumeConfiguration = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration :: Maybe OpenZFSCreateRootVolumeConfiguration
$sel:rootVolumeConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration
-> Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration} -> Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe OpenZFSCreateRootVolumeConfiguration
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:rootVolumeConfiguration:CreateFileSystemOpenZFSConfiguration' :: Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration = Maybe OpenZFSCreateRootVolumeConfiguration
a} :: CreateFileSystemOpenZFSConfiguration)

-- | Undocumented member.
createFileSystemOpenZFSConfiguration_weeklyMaintenanceStartTime :: Lens.Lens' CreateFileSystemOpenZFSConfiguration (Prelude.Maybe Prelude.Text)
createFileSystemOpenZFSConfiguration_weeklyMaintenanceStartTime :: Lens' CreateFileSystemOpenZFSConfiguration (Maybe Text)
createFileSystemOpenZFSConfiguration_weeklyMaintenanceStartTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Maybe Text
weeklyMaintenanceStartTime :: Maybe Text
$sel:weeklyMaintenanceStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
weeklyMaintenanceStartTime} -> Maybe Text
weeklyMaintenanceStartTime) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Maybe Text
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:weeklyMaintenanceStartTime:CreateFileSystemOpenZFSConfiguration' :: Maybe Text
weeklyMaintenanceStartTime = Maybe Text
a} :: CreateFileSystemOpenZFSConfiguration)

-- | Specifies the file system deployment type. Single AZ deployment types
-- are configured for redundancy within a single Availability Zone in an
-- Amazon Web Services Region . Valid values are the following:
--
-- -   @SINGLE_AZ_1@- (Default) Creates file systems with throughput
--     capacities of 64 - 4,096 MB\/s. @Single_AZ_1@ is available in all
--     Amazon Web Services Regions where Amazon FSx for OpenZFS is
--     available, except US West (Oregon).
--
-- -   @SINGLE_AZ_2@- Creates file systems with throughput capacities of
--     160 - 10,240 MB\/s using an NVMe L2ARC cache. @Single_AZ_2@ is
--     available only in the US East (N. Virginia), US East (Ohio), US West
--     (Oregon), and Europe (Ireland) Amazon Web Services Regions.
--
-- For more information, see:
-- <https://docs.aws.amazon.com/fsx/latest/OpenZFSGuide/availability-durability.html#available-aws-regions Deployment type availability>
-- and
-- <https://docs.aws.amazon.com/fsx/latest/OpenZFSGuide/performance.html#zfs-fs-performance File system performance>
-- in the /Amazon FSx for OpenZFS User Guide/.
createFileSystemOpenZFSConfiguration_deploymentType :: Lens.Lens' CreateFileSystemOpenZFSConfiguration OpenZFSDeploymentType
createFileSystemOpenZFSConfiguration_deploymentType :: Lens' CreateFileSystemOpenZFSConfiguration OpenZFSDeploymentType
createFileSystemOpenZFSConfiguration_deploymentType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {OpenZFSDeploymentType
deploymentType :: OpenZFSDeploymentType
$sel:deploymentType:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> OpenZFSDeploymentType
deploymentType} -> OpenZFSDeploymentType
deploymentType) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} OpenZFSDeploymentType
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:deploymentType:CreateFileSystemOpenZFSConfiguration' :: OpenZFSDeploymentType
deploymentType = OpenZFSDeploymentType
a} :: CreateFileSystemOpenZFSConfiguration)

-- | Specifies the throughput of an Amazon FSx for OpenZFS file system,
-- measured in megabytes per second (MB\/s). Valid values depend on the
-- DeploymentType you choose, as follows:
--
-- -   For @SINGLE_AZ_1@, valid values are 64, 128, 256, 512, 1024, 2048,
--     3072, or 4096 MB\/s.
--
-- -   For @SINGLE_AZ_2@, valid values are 160, 320, 640, 1280, 2560, 3840,
--     5120, 7680, or 10240 MB\/s.
--
-- You pay for additional throughput capacity that you provision.
createFileSystemOpenZFSConfiguration_throughputCapacity :: Lens.Lens' CreateFileSystemOpenZFSConfiguration Prelude.Natural
createFileSystemOpenZFSConfiguration_throughputCapacity :: Lens' CreateFileSystemOpenZFSConfiguration Natural
createFileSystemOpenZFSConfiguration_throughputCapacity = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateFileSystemOpenZFSConfiguration' {Natural
throughputCapacity :: Natural
$sel:throughputCapacity:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Natural
throughputCapacity} -> Natural
throughputCapacity) (\s :: CreateFileSystemOpenZFSConfiguration
s@CreateFileSystemOpenZFSConfiguration' {} Natural
a -> CreateFileSystemOpenZFSConfiguration
s {$sel:throughputCapacity:CreateFileSystemOpenZFSConfiguration' :: Natural
throughputCapacity = Natural
a} :: CreateFileSystemOpenZFSConfiguration)

instance
  Prelude.Hashable
    CreateFileSystemOpenZFSConfiguration
  where
  hashWithSalt :: Int -> CreateFileSystemOpenZFSConfiguration -> Int
hashWithSalt
    Int
_salt
    CreateFileSystemOpenZFSConfiguration' {Natural
Maybe Bool
Maybe Natural
Maybe Text
Maybe DiskIopsConfiguration
Maybe OpenZFSCreateRootVolumeConfiguration
OpenZFSDeploymentType
throughputCapacity :: Natural
deploymentType :: OpenZFSDeploymentType
weeklyMaintenanceStartTime :: Maybe Text
rootVolumeConfiguration :: Maybe OpenZFSCreateRootVolumeConfiguration
diskIopsConfiguration :: Maybe DiskIopsConfiguration
dailyAutomaticBackupStartTime :: Maybe Text
copyTagsToVolumes :: Maybe Bool
copyTagsToBackups :: Maybe Bool
automaticBackupRetentionDays :: Maybe Natural
$sel:throughputCapacity:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Natural
$sel:deploymentType:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> OpenZFSDeploymentType
$sel:weeklyMaintenanceStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
$sel:rootVolumeConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration
-> Maybe OpenZFSCreateRootVolumeConfiguration
$sel:diskIopsConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe DiskIopsConfiguration
$sel:dailyAutomaticBackupStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
$sel:copyTagsToVolumes:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
$sel:copyTagsToBackups:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
$sel:automaticBackupRetentionDays:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Natural
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
automaticBackupRetentionDays
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
copyTagsToBackups
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
copyTagsToVolumes
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
dailyAutomaticBackupStartTime
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe DiskIopsConfiguration
diskIopsConfiguration
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
weeklyMaintenanceStartTime
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` OpenZFSDeploymentType
deploymentType
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Natural
throughputCapacity

instance
  Prelude.NFData
    CreateFileSystemOpenZFSConfiguration
  where
  rnf :: CreateFileSystemOpenZFSConfiguration -> ()
rnf CreateFileSystemOpenZFSConfiguration' {Natural
Maybe Bool
Maybe Natural
Maybe Text
Maybe DiskIopsConfiguration
Maybe OpenZFSCreateRootVolumeConfiguration
OpenZFSDeploymentType
throughputCapacity :: Natural
deploymentType :: OpenZFSDeploymentType
weeklyMaintenanceStartTime :: Maybe Text
rootVolumeConfiguration :: Maybe OpenZFSCreateRootVolumeConfiguration
diskIopsConfiguration :: Maybe DiskIopsConfiguration
dailyAutomaticBackupStartTime :: Maybe Text
copyTagsToVolumes :: Maybe Bool
copyTagsToBackups :: Maybe Bool
automaticBackupRetentionDays :: Maybe Natural
$sel:throughputCapacity:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Natural
$sel:deploymentType:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> OpenZFSDeploymentType
$sel:weeklyMaintenanceStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
$sel:rootVolumeConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration
-> Maybe OpenZFSCreateRootVolumeConfiguration
$sel:diskIopsConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe DiskIopsConfiguration
$sel:dailyAutomaticBackupStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
$sel:copyTagsToVolumes:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
$sel:copyTagsToBackups:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
$sel:automaticBackupRetentionDays:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Natural
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
automaticBackupRetentionDays
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
copyTagsToBackups
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
copyTagsToVolumes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dailyAutomaticBackupStartTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe DiskIopsConfiguration
diskIopsConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
weeklyMaintenanceStartTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf OpenZFSDeploymentType
deploymentType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Natural
throughputCapacity

instance
  Data.ToJSON
    CreateFileSystemOpenZFSConfiguration
  where
  toJSON :: CreateFileSystemOpenZFSConfiguration -> Value
toJSON CreateFileSystemOpenZFSConfiguration' {Natural
Maybe Bool
Maybe Natural
Maybe Text
Maybe DiskIopsConfiguration
Maybe OpenZFSCreateRootVolumeConfiguration
OpenZFSDeploymentType
throughputCapacity :: Natural
deploymentType :: OpenZFSDeploymentType
weeklyMaintenanceStartTime :: Maybe Text
rootVolumeConfiguration :: Maybe OpenZFSCreateRootVolumeConfiguration
diskIopsConfiguration :: Maybe DiskIopsConfiguration
dailyAutomaticBackupStartTime :: Maybe Text
copyTagsToVolumes :: Maybe Bool
copyTagsToBackups :: Maybe Bool
automaticBackupRetentionDays :: Maybe Natural
$sel:throughputCapacity:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Natural
$sel:deploymentType:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> OpenZFSDeploymentType
$sel:weeklyMaintenanceStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
$sel:rootVolumeConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration
-> Maybe OpenZFSCreateRootVolumeConfiguration
$sel:diskIopsConfiguration:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe DiskIopsConfiguration
$sel:dailyAutomaticBackupStartTime:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Text
$sel:copyTagsToVolumes:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
$sel:copyTagsToBackups:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Bool
$sel:automaticBackupRetentionDays:CreateFileSystemOpenZFSConfiguration' :: CreateFileSystemOpenZFSConfiguration -> Maybe Natural
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"AutomaticBackupRetentionDays" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Natural
automaticBackupRetentionDays,
            (Key
"CopyTagsToBackups" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Bool
copyTagsToBackups,
            (Key
"CopyTagsToVolumes" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Bool
copyTagsToVolumes,
            (Key
"DailyAutomaticBackupStartTime" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
dailyAutomaticBackupStartTime,
            (Key
"DiskIopsConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DiskIopsConfiguration
diskIopsConfiguration,
            (Key
"RootVolumeConfiguration" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe OpenZFSCreateRootVolumeConfiguration
rootVolumeConfiguration,
            (Key
"WeeklyMaintenanceStartTime" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=)
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
weeklyMaintenanceStartTime,
            forall a. a -> Maybe a
Prelude.Just
              (Key
"DeploymentType" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= OpenZFSDeploymentType
deploymentType),
            forall a. a -> Maybe a
Prelude.Just
              (Key
"ThroughputCapacity" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Natural
throughputCapacity)
          ]
      )