{-# 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.RDS.Types.PendingModifiedValues
-- 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.RDS.Types.PendingModifiedValues where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import Amazonka.RDS.Types.AutomationMode
import Amazonka.RDS.Types.PendingCloudwatchLogsExports
import Amazonka.RDS.Types.ProcessorFeature

-- | This data type is used as a response element in the @ModifyDBInstance@
-- operation and contains changes that will be applied during the next
-- maintenance window.
--
-- /See:/ 'newPendingModifiedValues' smart constructor.
data PendingModifiedValues = PendingModifiedValues'
  { -- | The allocated storage size for the DB instance specified in gibibytes
    -- (GiB).
    PendingModifiedValues -> Maybe Int
allocatedStorage :: Prelude.Maybe Prelude.Int,
    -- | The automation mode of the RDS Custom DB instance: @full@ or
    -- @all-paused@. If @full@, the DB instance automates monitoring and
    -- instance recovery. If @all-paused@, the instance pauses automation for
    -- the duration set by @--resume-full-automation-mode-minutes@.
    PendingModifiedValues -> Maybe AutomationMode
automationMode :: Prelude.Maybe AutomationMode,
    -- | The number of days for which automated backups are retained.
    PendingModifiedValues -> Maybe Int
backupRetentionPeriod :: Prelude.Maybe Prelude.Int,
    -- | The identifier of the CA certificate for the DB instance.
    --
    -- For more information, see
    -- <https://docs.aws.amazon.com/AmazonRDS/latest/UserGuide/UsingWithRDS.SSL.html Using SSL\/TLS to encrypt a connection to a DB instance>
    -- in the /Amazon RDS User Guide/ and
    -- <https://docs.aws.amazon.com/AmazonRDS/latest/AuroraUserGuide/UsingWithRDS.SSL.html Using SSL\/TLS to encrypt a connection to a DB cluster>
    -- in the /Amazon Aurora User Guide/.
    PendingModifiedValues -> Maybe Text
cACertificateIdentifier :: Prelude.Maybe Prelude.Text,
    -- | The name of the compute and memory capacity class for the DB instance.
    PendingModifiedValues -> Maybe Text
dbInstanceClass :: Prelude.Maybe Prelude.Text,
    -- | The database identifier for the DB instance.
    PendingModifiedValues -> Maybe Text
dbInstanceIdentifier :: Prelude.Maybe Prelude.Text,
    -- | The DB subnet group for the DB instance.
    PendingModifiedValues -> Maybe Text
dbSubnetGroupName :: Prelude.Maybe Prelude.Text,
    -- | The database engine version.
    PendingModifiedValues -> Maybe Text
engineVersion :: Prelude.Maybe Prelude.Text,
    -- | Whether mapping of Amazon Web Services Identity and Access Management
    -- (IAM) accounts to database accounts is enabled.
    PendingModifiedValues -> Maybe Bool
iAMDatabaseAuthenticationEnabled :: Prelude.Maybe Prelude.Bool,
    -- | The Provisioned IOPS value for the DB instance.
    PendingModifiedValues -> Maybe Int
iops :: Prelude.Maybe Prelude.Int,
    -- | The license model for the DB instance.
    --
    -- Valid values: @license-included@ | @bring-your-own-license@ |
    -- @general-public-license@
    PendingModifiedValues -> Maybe Text
licenseModel :: Prelude.Maybe Prelude.Text,
    -- | The master credentials for the DB instance.
    PendingModifiedValues -> Maybe Text
masterUserPassword :: Prelude.Maybe Prelude.Text,
    -- | A value that indicates that the Single-AZ DB instance will change to a
    -- Multi-AZ deployment.
    PendingModifiedValues -> Maybe Bool
multiAZ :: Prelude.Maybe Prelude.Bool,
    PendingModifiedValues -> Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports :: Prelude.Maybe PendingCloudwatchLogsExports,
    -- | The port for the DB instance.
    PendingModifiedValues -> Maybe Int
port :: Prelude.Maybe Prelude.Int,
    -- | The number of CPU cores and the number of threads per core for the DB
    -- instance class of the DB instance.
    PendingModifiedValues -> Maybe [ProcessorFeature]
processorFeatures :: Prelude.Maybe [ProcessorFeature],
    -- | The number of minutes to pause the automation. When the time period
    -- ends, RDS Custom resumes full automation. The minimum value is 60
    -- (default). The maximum value is 1,440.
    PendingModifiedValues -> Maybe ISO8601
resumeFullAutomationModeTime :: Prelude.Maybe Data.ISO8601,
    -- | The storage throughput of the DB instance.
    PendingModifiedValues -> Maybe Int
storageThroughput :: Prelude.Maybe Prelude.Int,
    -- | The storage type of the DB instance.
    PendingModifiedValues -> Maybe Text
storageType :: Prelude.Maybe Prelude.Text
  }
  deriving (PendingModifiedValues -> PendingModifiedValues -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PendingModifiedValues -> PendingModifiedValues -> Bool
$c/= :: PendingModifiedValues -> PendingModifiedValues -> Bool
== :: PendingModifiedValues -> PendingModifiedValues -> Bool
$c== :: PendingModifiedValues -> PendingModifiedValues -> Bool
Prelude.Eq, ReadPrec [PendingModifiedValues]
ReadPrec PendingModifiedValues
Int -> ReadS PendingModifiedValues
ReadS [PendingModifiedValues]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [PendingModifiedValues]
$creadListPrec :: ReadPrec [PendingModifiedValues]
readPrec :: ReadPrec PendingModifiedValues
$creadPrec :: ReadPrec PendingModifiedValues
readList :: ReadS [PendingModifiedValues]
$creadList :: ReadS [PendingModifiedValues]
readsPrec :: Int -> ReadS PendingModifiedValues
$creadsPrec :: Int -> ReadS PendingModifiedValues
Prelude.Read, Int -> PendingModifiedValues -> ShowS
[PendingModifiedValues] -> ShowS
PendingModifiedValues -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PendingModifiedValues] -> ShowS
$cshowList :: [PendingModifiedValues] -> ShowS
show :: PendingModifiedValues -> String
$cshow :: PendingModifiedValues -> String
showsPrec :: Int -> PendingModifiedValues -> ShowS
$cshowsPrec :: Int -> PendingModifiedValues -> ShowS
Prelude.Show, forall x. Rep PendingModifiedValues x -> PendingModifiedValues
forall x. PendingModifiedValues -> Rep PendingModifiedValues x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep PendingModifiedValues x -> PendingModifiedValues
$cfrom :: forall x. PendingModifiedValues -> Rep PendingModifiedValues x
Prelude.Generic)

-- |
-- Create a value of 'PendingModifiedValues' 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:
--
-- 'allocatedStorage', 'pendingModifiedValues_allocatedStorage' - The allocated storage size for the DB instance specified in gibibytes
-- (GiB).
--
-- 'automationMode', 'pendingModifiedValues_automationMode' - The automation mode of the RDS Custom DB instance: @full@ or
-- @all-paused@. If @full@, the DB instance automates monitoring and
-- instance recovery. If @all-paused@, the instance pauses automation for
-- the duration set by @--resume-full-automation-mode-minutes@.
--
-- 'backupRetentionPeriod', 'pendingModifiedValues_backupRetentionPeriod' - The number of days for which automated backups are retained.
--
-- 'cACertificateIdentifier', 'pendingModifiedValues_cACertificateIdentifier' - The identifier of the CA certificate for the DB instance.
--
-- For more information, see
-- <https://docs.aws.amazon.com/AmazonRDS/latest/UserGuide/UsingWithRDS.SSL.html Using SSL\/TLS to encrypt a connection to a DB instance>
-- in the /Amazon RDS User Guide/ and
-- <https://docs.aws.amazon.com/AmazonRDS/latest/AuroraUserGuide/UsingWithRDS.SSL.html Using SSL\/TLS to encrypt a connection to a DB cluster>
-- in the /Amazon Aurora User Guide/.
--
-- 'dbInstanceClass', 'pendingModifiedValues_dbInstanceClass' - The name of the compute and memory capacity class for the DB instance.
--
-- 'dbInstanceIdentifier', 'pendingModifiedValues_dbInstanceIdentifier' - The database identifier for the DB instance.
--
-- 'dbSubnetGroupName', 'pendingModifiedValues_dbSubnetGroupName' - The DB subnet group for the DB instance.
--
-- 'engineVersion', 'pendingModifiedValues_engineVersion' - The database engine version.
--
-- 'iAMDatabaseAuthenticationEnabled', 'pendingModifiedValues_iAMDatabaseAuthenticationEnabled' - Whether mapping of Amazon Web Services Identity and Access Management
-- (IAM) accounts to database accounts is enabled.
--
-- 'iops', 'pendingModifiedValues_iops' - The Provisioned IOPS value for the DB instance.
--
-- 'licenseModel', 'pendingModifiedValues_licenseModel' - The license model for the DB instance.
--
-- Valid values: @license-included@ | @bring-your-own-license@ |
-- @general-public-license@
--
-- 'masterUserPassword', 'pendingModifiedValues_masterUserPassword' - The master credentials for the DB instance.
--
-- 'multiAZ', 'pendingModifiedValues_multiAZ' - A value that indicates that the Single-AZ DB instance will change to a
-- Multi-AZ deployment.
--
-- 'pendingCloudwatchLogsExports', 'pendingModifiedValues_pendingCloudwatchLogsExports' - Undocumented member.
--
-- 'port', 'pendingModifiedValues_port' - The port for the DB instance.
--
-- 'processorFeatures', 'pendingModifiedValues_processorFeatures' - The number of CPU cores and the number of threads per core for the DB
-- instance class of the DB instance.
--
-- 'resumeFullAutomationModeTime', 'pendingModifiedValues_resumeFullAutomationModeTime' - The number of minutes to pause the automation. When the time period
-- ends, RDS Custom resumes full automation. The minimum value is 60
-- (default). The maximum value is 1,440.
--
-- 'storageThroughput', 'pendingModifiedValues_storageThroughput' - The storage throughput of the DB instance.
--
-- 'storageType', 'pendingModifiedValues_storageType' - The storage type of the DB instance.
newPendingModifiedValues ::
  PendingModifiedValues
newPendingModifiedValues :: PendingModifiedValues
newPendingModifiedValues =
  PendingModifiedValues'
    { $sel:allocatedStorage:PendingModifiedValues' :: Maybe Int
allocatedStorage =
        forall a. Maybe a
Prelude.Nothing,
      $sel:automationMode:PendingModifiedValues' :: Maybe AutomationMode
automationMode = forall a. Maybe a
Prelude.Nothing,
      $sel:backupRetentionPeriod:PendingModifiedValues' :: Maybe Int
backupRetentionPeriod = forall a. Maybe a
Prelude.Nothing,
      $sel:cACertificateIdentifier:PendingModifiedValues' :: Maybe Text
cACertificateIdentifier = forall a. Maybe a
Prelude.Nothing,
      $sel:dbInstanceClass:PendingModifiedValues' :: Maybe Text
dbInstanceClass = forall a. Maybe a
Prelude.Nothing,
      $sel:dbInstanceIdentifier:PendingModifiedValues' :: Maybe Text
dbInstanceIdentifier = forall a. Maybe a
Prelude.Nothing,
      $sel:dbSubnetGroupName:PendingModifiedValues' :: Maybe Text
dbSubnetGroupName = forall a. Maybe a
Prelude.Nothing,
      $sel:engineVersion:PendingModifiedValues' :: Maybe Text
engineVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:iAMDatabaseAuthenticationEnabled:PendingModifiedValues' :: Maybe Bool
iAMDatabaseAuthenticationEnabled = forall a. Maybe a
Prelude.Nothing,
      $sel:iops:PendingModifiedValues' :: Maybe Int
iops = forall a. Maybe a
Prelude.Nothing,
      $sel:licenseModel:PendingModifiedValues' :: Maybe Text
licenseModel = forall a. Maybe a
Prelude.Nothing,
      $sel:masterUserPassword:PendingModifiedValues' :: Maybe Text
masterUserPassword = forall a. Maybe a
Prelude.Nothing,
      $sel:multiAZ:PendingModifiedValues' :: Maybe Bool
multiAZ = forall a. Maybe a
Prelude.Nothing,
      $sel:pendingCloudwatchLogsExports:PendingModifiedValues' :: Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports = forall a. Maybe a
Prelude.Nothing,
      $sel:port:PendingModifiedValues' :: Maybe Int
port = forall a. Maybe a
Prelude.Nothing,
      $sel:processorFeatures:PendingModifiedValues' :: Maybe [ProcessorFeature]
processorFeatures = forall a. Maybe a
Prelude.Nothing,
      $sel:resumeFullAutomationModeTime:PendingModifiedValues' :: Maybe ISO8601
resumeFullAutomationModeTime = forall a. Maybe a
Prelude.Nothing,
      $sel:storageThroughput:PendingModifiedValues' :: Maybe Int
storageThroughput = forall a. Maybe a
Prelude.Nothing,
      $sel:storageType:PendingModifiedValues' :: Maybe Text
storageType = forall a. Maybe a
Prelude.Nothing
    }

-- | The allocated storage size for the DB instance specified in gibibytes
-- (GiB).
pendingModifiedValues_allocatedStorage :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Int)
pendingModifiedValues_allocatedStorage :: Lens' PendingModifiedValues (Maybe Int)
pendingModifiedValues_allocatedStorage = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Int
allocatedStorage :: Maybe Int
$sel:allocatedStorage:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
allocatedStorage} -> Maybe Int
allocatedStorage) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Int
a -> PendingModifiedValues
s {$sel:allocatedStorage:PendingModifiedValues' :: Maybe Int
allocatedStorage = Maybe Int
a} :: PendingModifiedValues)

-- | The automation mode of the RDS Custom DB instance: @full@ or
-- @all-paused@. If @full@, the DB instance automates monitoring and
-- instance recovery. If @all-paused@, the instance pauses automation for
-- the duration set by @--resume-full-automation-mode-minutes@.
pendingModifiedValues_automationMode :: Lens.Lens' PendingModifiedValues (Prelude.Maybe AutomationMode)
pendingModifiedValues_automationMode :: Lens' PendingModifiedValues (Maybe AutomationMode)
pendingModifiedValues_automationMode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe AutomationMode
automationMode :: Maybe AutomationMode
$sel:automationMode:PendingModifiedValues' :: PendingModifiedValues -> Maybe AutomationMode
automationMode} -> Maybe AutomationMode
automationMode) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe AutomationMode
a -> PendingModifiedValues
s {$sel:automationMode:PendingModifiedValues' :: Maybe AutomationMode
automationMode = Maybe AutomationMode
a} :: PendingModifiedValues)

-- | The number of days for which automated backups are retained.
pendingModifiedValues_backupRetentionPeriod :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Int)
pendingModifiedValues_backupRetentionPeriod :: Lens' PendingModifiedValues (Maybe Int)
pendingModifiedValues_backupRetentionPeriod = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Int
backupRetentionPeriod :: Maybe Int
$sel:backupRetentionPeriod:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
backupRetentionPeriod} -> Maybe Int
backupRetentionPeriod) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Int
a -> PendingModifiedValues
s {$sel:backupRetentionPeriod:PendingModifiedValues' :: Maybe Int
backupRetentionPeriod = Maybe Int
a} :: PendingModifiedValues)

-- | The identifier of the CA certificate for the DB instance.
--
-- For more information, see
-- <https://docs.aws.amazon.com/AmazonRDS/latest/UserGuide/UsingWithRDS.SSL.html Using SSL\/TLS to encrypt a connection to a DB instance>
-- in the /Amazon RDS User Guide/ and
-- <https://docs.aws.amazon.com/AmazonRDS/latest/AuroraUserGuide/UsingWithRDS.SSL.html Using SSL\/TLS to encrypt a connection to a DB cluster>
-- in the /Amazon Aurora User Guide/.
pendingModifiedValues_cACertificateIdentifier :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_cACertificateIdentifier :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_cACertificateIdentifier = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
cACertificateIdentifier :: Maybe Text
$sel:cACertificateIdentifier:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
cACertificateIdentifier} -> Maybe Text
cACertificateIdentifier) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:cACertificateIdentifier:PendingModifiedValues' :: Maybe Text
cACertificateIdentifier = Maybe Text
a} :: PendingModifiedValues)

-- | The name of the compute and memory capacity class for the DB instance.
pendingModifiedValues_dbInstanceClass :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_dbInstanceClass :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_dbInstanceClass = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
dbInstanceClass :: Maybe Text
$sel:dbInstanceClass:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
dbInstanceClass} -> Maybe Text
dbInstanceClass) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:dbInstanceClass:PendingModifiedValues' :: Maybe Text
dbInstanceClass = Maybe Text
a} :: PendingModifiedValues)

-- | The database identifier for the DB instance.
pendingModifiedValues_dbInstanceIdentifier :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_dbInstanceIdentifier :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_dbInstanceIdentifier = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
dbInstanceIdentifier :: Maybe Text
$sel:dbInstanceIdentifier:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
dbInstanceIdentifier} -> Maybe Text
dbInstanceIdentifier) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:dbInstanceIdentifier:PendingModifiedValues' :: Maybe Text
dbInstanceIdentifier = Maybe Text
a} :: PendingModifiedValues)

-- | The DB subnet group for the DB instance.
pendingModifiedValues_dbSubnetGroupName :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_dbSubnetGroupName :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_dbSubnetGroupName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
dbSubnetGroupName :: Maybe Text
$sel:dbSubnetGroupName:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
dbSubnetGroupName} -> Maybe Text
dbSubnetGroupName) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:dbSubnetGroupName:PendingModifiedValues' :: Maybe Text
dbSubnetGroupName = Maybe Text
a} :: PendingModifiedValues)

-- | The database engine version.
pendingModifiedValues_engineVersion :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_engineVersion :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_engineVersion = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
engineVersion :: Maybe Text
$sel:engineVersion:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
engineVersion} -> Maybe Text
engineVersion) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:engineVersion:PendingModifiedValues' :: Maybe Text
engineVersion = Maybe Text
a} :: PendingModifiedValues)

-- | Whether mapping of Amazon Web Services Identity and Access Management
-- (IAM) accounts to database accounts is enabled.
pendingModifiedValues_iAMDatabaseAuthenticationEnabled :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Bool)
pendingModifiedValues_iAMDatabaseAuthenticationEnabled :: Lens' PendingModifiedValues (Maybe Bool)
pendingModifiedValues_iAMDatabaseAuthenticationEnabled = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Bool
iAMDatabaseAuthenticationEnabled :: Maybe Bool
$sel:iAMDatabaseAuthenticationEnabled:PendingModifiedValues' :: PendingModifiedValues -> Maybe Bool
iAMDatabaseAuthenticationEnabled} -> Maybe Bool
iAMDatabaseAuthenticationEnabled) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Bool
a -> PendingModifiedValues
s {$sel:iAMDatabaseAuthenticationEnabled:PendingModifiedValues' :: Maybe Bool
iAMDatabaseAuthenticationEnabled = Maybe Bool
a} :: PendingModifiedValues)

-- | The Provisioned IOPS value for the DB instance.
pendingModifiedValues_iops :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Int)
pendingModifiedValues_iops :: Lens' PendingModifiedValues (Maybe Int)
pendingModifiedValues_iops = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Int
iops :: Maybe Int
$sel:iops:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
iops} -> Maybe Int
iops) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Int
a -> PendingModifiedValues
s {$sel:iops:PendingModifiedValues' :: Maybe Int
iops = Maybe Int
a} :: PendingModifiedValues)

-- | The license model for the DB instance.
--
-- Valid values: @license-included@ | @bring-your-own-license@ |
-- @general-public-license@
pendingModifiedValues_licenseModel :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_licenseModel :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_licenseModel = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
licenseModel :: Maybe Text
$sel:licenseModel:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
licenseModel} -> Maybe Text
licenseModel) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:licenseModel:PendingModifiedValues' :: Maybe Text
licenseModel = Maybe Text
a} :: PendingModifiedValues)

-- | The master credentials for the DB instance.
pendingModifiedValues_masterUserPassword :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_masterUserPassword :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_masterUserPassword = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
masterUserPassword :: Maybe Text
$sel:masterUserPassword:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
masterUserPassword} -> Maybe Text
masterUserPassword) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:masterUserPassword:PendingModifiedValues' :: Maybe Text
masterUserPassword = Maybe Text
a} :: PendingModifiedValues)

-- | A value that indicates that the Single-AZ DB instance will change to a
-- Multi-AZ deployment.
pendingModifiedValues_multiAZ :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Bool)
pendingModifiedValues_multiAZ :: Lens' PendingModifiedValues (Maybe Bool)
pendingModifiedValues_multiAZ = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Bool
multiAZ :: Maybe Bool
$sel:multiAZ:PendingModifiedValues' :: PendingModifiedValues -> Maybe Bool
multiAZ} -> Maybe Bool
multiAZ) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Bool
a -> PendingModifiedValues
s {$sel:multiAZ:PendingModifiedValues' :: Maybe Bool
multiAZ = Maybe Bool
a} :: PendingModifiedValues)

-- | Undocumented member.
pendingModifiedValues_pendingCloudwatchLogsExports :: Lens.Lens' PendingModifiedValues (Prelude.Maybe PendingCloudwatchLogsExports)
pendingModifiedValues_pendingCloudwatchLogsExports :: Lens' PendingModifiedValues (Maybe PendingCloudwatchLogsExports)
pendingModifiedValues_pendingCloudwatchLogsExports = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports :: Maybe PendingCloudwatchLogsExports
$sel:pendingCloudwatchLogsExports:PendingModifiedValues' :: PendingModifiedValues -> Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports} -> Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe PendingCloudwatchLogsExports
a -> PendingModifiedValues
s {$sel:pendingCloudwatchLogsExports:PendingModifiedValues' :: Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports = Maybe PendingCloudwatchLogsExports
a} :: PendingModifiedValues)

-- | The port for the DB instance.
pendingModifiedValues_port :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Int)
pendingModifiedValues_port :: Lens' PendingModifiedValues (Maybe Int)
pendingModifiedValues_port = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Int
port :: Maybe Int
$sel:port:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
port} -> Maybe Int
port) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Int
a -> PendingModifiedValues
s {$sel:port:PendingModifiedValues' :: Maybe Int
port = Maybe Int
a} :: PendingModifiedValues)

-- | The number of CPU cores and the number of threads per core for the DB
-- instance class of the DB instance.
pendingModifiedValues_processorFeatures :: Lens.Lens' PendingModifiedValues (Prelude.Maybe [ProcessorFeature])
pendingModifiedValues_processorFeatures :: Lens' PendingModifiedValues (Maybe [ProcessorFeature])
pendingModifiedValues_processorFeatures = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe [ProcessorFeature]
processorFeatures :: Maybe [ProcessorFeature]
$sel:processorFeatures:PendingModifiedValues' :: PendingModifiedValues -> Maybe [ProcessorFeature]
processorFeatures} -> Maybe [ProcessorFeature]
processorFeatures) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe [ProcessorFeature]
a -> PendingModifiedValues
s {$sel:processorFeatures:PendingModifiedValues' :: Maybe [ProcessorFeature]
processorFeatures = Maybe [ProcessorFeature]
a} :: PendingModifiedValues) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The number of minutes to pause the automation. When the time period
-- ends, RDS Custom resumes full automation. The minimum value is 60
-- (default). The maximum value is 1,440.
pendingModifiedValues_resumeFullAutomationModeTime :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.UTCTime)
pendingModifiedValues_resumeFullAutomationModeTime :: Lens' PendingModifiedValues (Maybe UTCTime)
pendingModifiedValues_resumeFullAutomationModeTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe ISO8601
resumeFullAutomationModeTime :: Maybe ISO8601
$sel:resumeFullAutomationModeTime:PendingModifiedValues' :: PendingModifiedValues -> Maybe ISO8601
resumeFullAutomationModeTime} -> Maybe ISO8601
resumeFullAutomationModeTime) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe ISO8601
a -> PendingModifiedValues
s {$sel:resumeFullAutomationModeTime:PendingModifiedValues' :: Maybe ISO8601
resumeFullAutomationModeTime = Maybe ISO8601
a} :: PendingModifiedValues) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | The storage throughput of the DB instance.
pendingModifiedValues_storageThroughput :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Int)
pendingModifiedValues_storageThroughput :: Lens' PendingModifiedValues (Maybe Int)
pendingModifiedValues_storageThroughput = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Int
storageThroughput :: Maybe Int
$sel:storageThroughput:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
storageThroughput} -> Maybe Int
storageThroughput) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Int
a -> PendingModifiedValues
s {$sel:storageThroughput:PendingModifiedValues' :: Maybe Int
storageThroughput = Maybe Int
a} :: PendingModifiedValues)

-- | The storage type of the DB instance.
pendingModifiedValues_storageType :: Lens.Lens' PendingModifiedValues (Prelude.Maybe Prelude.Text)
pendingModifiedValues_storageType :: Lens' PendingModifiedValues (Maybe Text)
pendingModifiedValues_storageType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\PendingModifiedValues' {Maybe Text
storageType :: Maybe Text
$sel:storageType:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
storageType} -> Maybe Text
storageType) (\s :: PendingModifiedValues
s@PendingModifiedValues' {} Maybe Text
a -> PendingModifiedValues
s {$sel:storageType:PendingModifiedValues' :: Maybe Text
storageType = Maybe Text
a} :: PendingModifiedValues)

instance Data.FromXML PendingModifiedValues where
  parseXML :: [Node] -> Either String PendingModifiedValues
parseXML [Node]
x =
    Maybe Int
-> Maybe AutomationMode
-> Maybe Int
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Bool
-> Maybe Int
-> Maybe Text
-> Maybe Text
-> Maybe Bool
-> Maybe PendingCloudwatchLogsExports
-> Maybe Int
-> Maybe [ProcessorFeature]
-> Maybe ISO8601
-> Maybe Int
-> Maybe Text
-> PendingModifiedValues
PendingModifiedValues'
      forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"AllocatedStorage")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"AutomationMode")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"BackupRetentionPeriod")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"CACertificateIdentifier")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"DBInstanceClass")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"DBInstanceIdentifier")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"DBSubnetGroupName")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"EngineVersion")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"IAMDatabaseAuthenticationEnabled")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"Iops")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"LicenseModel")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"MasterUserPassword")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"MultiAZ")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"PendingCloudwatchLogsExports")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"Port")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ( [Node]
x
                      forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"ProcessorFeatures"
                      forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty
                      forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
Prelude.>>= forall (f :: * -> *) a b.
Applicative f =>
([a] -> f b) -> [a] -> f (Maybe b)
Core.may (forall a. FromXML a => Text -> [Node] -> Either String [a]
Data.parseXMLList Text
"ProcessorFeature")
                  )
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"ResumeFullAutomationModeTime")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"StorageThroughput")
      forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"StorageType")

instance Prelude.Hashable PendingModifiedValues where
  hashWithSalt :: Int -> PendingModifiedValues -> Int
hashWithSalt Int
_salt PendingModifiedValues' {Maybe Bool
Maybe Int
Maybe [ProcessorFeature]
Maybe Text
Maybe ISO8601
Maybe AutomationMode
Maybe PendingCloudwatchLogsExports
storageType :: Maybe Text
storageThroughput :: Maybe Int
resumeFullAutomationModeTime :: Maybe ISO8601
processorFeatures :: Maybe [ProcessorFeature]
port :: Maybe Int
pendingCloudwatchLogsExports :: Maybe PendingCloudwatchLogsExports
multiAZ :: Maybe Bool
masterUserPassword :: Maybe Text
licenseModel :: Maybe Text
iops :: Maybe Int
iAMDatabaseAuthenticationEnabled :: Maybe Bool
engineVersion :: Maybe Text
dbSubnetGroupName :: Maybe Text
dbInstanceIdentifier :: Maybe Text
dbInstanceClass :: Maybe Text
cACertificateIdentifier :: Maybe Text
backupRetentionPeriod :: Maybe Int
automationMode :: Maybe AutomationMode
allocatedStorage :: Maybe Int
$sel:storageType:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:storageThroughput:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:resumeFullAutomationModeTime:PendingModifiedValues' :: PendingModifiedValues -> Maybe ISO8601
$sel:processorFeatures:PendingModifiedValues' :: PendingModifiedValues -> Maybe [ProcessorFeature]
$sel:port:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:pendingCloudwatchLogsExports:PendingModifiedValues' :: PendingModifiedValues -> Maybe PendingCloudwatchLogsExports
$sel:multiAZ:PendingModifiedValues' :: PendingModifiedValues -> Maybe Bool
$sel:masterUserPassword:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:licenseModel:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:iops:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:iAMDatabaseAuthenticationEnabled:PendingModifiedValues' :: PendingModifiedValues -> Maybe Bool
$sel:engineVersion:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:dbSubnetGroupName:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:dbInstanceIdentifier:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:dbInstanceClass:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:cACertificateIdentifier:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:backupRetentionPeriod:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:automationMode:PendingModifiedValues' :: PendingModifiedValues -> Maybe AutomationMode
$sel:allocatedStorage:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
allocatedStorage
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe AutomationMode
automationMode
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
backupRetentionPeriod
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
cACertificateIdentifier
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
dbInstanceClass
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
dbInstanceIdentifier
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
dbSubnetGroupName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
engineVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
iAMDatabaseAuthenticationEnabled
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
iops
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
licenseModel
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
masterUserPassword
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
multiAZ
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
port
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [ProcessorFeature]
processorFeatures
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ISO8601
resumeFullAutomationModeTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
storageThroughput
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
storageType

instance Prelude.NFData PendingModifiedValues where
  rnf :: PendingModifiedValues -> ()
rnf PendingModifiedValues' {Maybe Bool
Maybe Int
Maybe [ProcessorFeature]
Maybe Text
Maybe ISO8601
Maybe AutomationMode
Maybe PendingCloudwatchLogsExports
storageType :: Maybe Text
storageThroughput :: Maybe Int
resumeFullAutomationModeTime :: Maybe ISO8601
processorFeatures :: Maybe [ProcessorFeature]
port :: Maybe Int
pendingCloudwatchLogsExports :: Maybe PendingCloudwatchLogsExports
multiAZ :: Maybe Bool
masterUserPassword :: Maybe Text
licenseModel :: Maybe Text
iops :: Maybe Int
iAMDatabaseAuthenticationEnabled :: Maybe Bool
engineVersion :: Maybe Text
dbSubnetGroupName :: Maybe Text
dbInstanceIdentifier :: Maybe Text
dbInstanceClass :: Maybe Text
cACertificateIdentifier :: Maybe Text
backupRetentionPeriod :: Maybe Int
automationMode :: Maybe AutomationMode
allocatedStorage :: Maybe Int
$sel:storageType:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:storageThroughput:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:resumeFullAutomationModeTime:PendingModifiedValues' :: PendingModifiedValues -> Maybe ISO8601
$sel:processorFeatures:PendingModifiedValues' :: PendingModifiedValues -> Maybe [ProcessorFeature]
$sel:port:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:pendingCloudwatchLogsExports:PendingModifiedValues' :: PendingModifiedValues -> Maybe PendingCloudwatchLogsExports
$sel:multiAZ:PendingModifiedValues' :: PendingModifiedValues -> Maybe Bool
$sel:masterUserPassword:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:licenseModel:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:iops:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:iAMDatabaseAuthenticationEnabled:PendingModifiedValues' :: PendingModifiedValues -> Maybe Bool
$sel:engineVersion:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:dbSubnetGroupName:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:dbInstanceIdentifier:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:dbInstanceClass:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:cACertificateIdentifier:PendingModifiedValues' :: PendingModifiedValues -> Maybe Text
$sel:backupRetentionPeriod:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
$sel:automationMode:PendingModifiedValues' :: PendingModifiedValues -> Maybe AutomationMode
$sel:allocatedStorage:PendingModifiedValues' :: PendingModifiedValues -> Maybe Int
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
allocatedStorage
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe AutomationMode
automationMode
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
backupRetentionPeriod
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
cACertificateIdentifier
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dbInstanceClass
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dbInstanceIdentifier
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dbSubnetGroupName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
engineVersion
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
iAMDatabaseAuthenticationEnabled
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
iops
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
licenseModel
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
masterUserPassword
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
multiAZ
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe PendingCloudwatchLogsExports
pendingCloudwatchLogsExports
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
port
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [ProcessorFeature]
processorFeatures
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe ISO8601
resumeFullAutomationModeTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
storageThroughput
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
storageType