{-# 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.DocumentDB.Types.GlobalCluster
-- 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.DocumentDB.Types.GlobalCluster where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.DocumentDB.Types.GlobalClusterMember
import qualified Amazonka.Prelude as Prelude

-- | A data type representing an Amazon DocumentDB global cluster.
--
-- /See:/ 'newGlobalCluster' smart constructor.
data GlobalCluster = GlobalCluster'
  { -- | The default database name within the new global cluster.
    GlobalCluster -> Maybe Text
databaseName :: Prelude.Maybe Prelude.Text,
    -- | The deletion protection setting for the new global cluster.
    GlobalCluster -> Maybe Bool
deletionProtection :: Prelude.Maybe Prelude.Bool,
    -- | The Amazon DocumentDB database engine used by the global cluster.
    GlobalCluster -> Maybe Text
engine :: Prelude.Maybe Prelude.Text,
    -- | Indicates the database engine version.
    GlobalCluster -> Maybe Text
engineVersion :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name (ARN) for the global cluster.
    GlobalCluster -> Maybe Text
globalClusterArn :: Prelude.Maybe Prelude.Text,
    -- | Contains a user-supplied global cluster identifier. This identifier is
    -- the unique key that identifies a global cluster.
    GlobalCluster -> Maybe Text
globalClusterIdentifier :: Prelude.Maybe Prelude.Text,
    -- | The list of cluster IDs for secondary clusters within the global
    -- cluster. Currently limited to one item.
    GlobalCluster -> Maybe [GlobalClusterMember]
globalClusterMembers :: Prelude.Maybe [GlobalClusterMember],
    -- | The Amazon Web Services Region-unique, immutable identifier for the
    -- global database cluster. This identifier is found in AWS CloudTrail log
    -- entries whenever the AWS KMS customer master key (CMK) for the cluster
    -- is accessed.
    GlobalCluster -> Maybe Text
globalClusterResourceId :: Prelude.Maybe Prelude.Text,
    -- | Specifies the current state of this global cluster.
    GlobalCluster -> Maybe Text
status :: Prelude.Maybe Prelude.Text,
    -- | The storage encryption setting for the global cluster.
    GlobalCluster -> Maybe Bool
storageEncrypted :: Prelude.Maybe Prelude.Bool
  }
  deriving (GlobalCluster -> GlobalCluster -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GlobalCluster -> GlobalCluster -> Bool
$c/= :: GlobalCluster -> GlobalCluster -> Bool
== :: GlobalCluster -> GlobalCluster -> Bool
$c== :: GlobalCluster -> GlobalCluster -> Bool
Prelude.Eq, ReadPrec [GlobalCluster]
ReadPrec GlobalCluster
Int -> ReadS GlobalCluster
ReadS [GlobalCluster]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GlobalCluster]
$creadListPrec :: ReadPrec [GlobalCluster]
readPrec :: ReadPrec GlobalCluster
$creadPrec :: ReadPrec GlobalCluster
readList :: ReadS [GlobalCluster]
$creadList :: ReadS [GlobalCluster]
readsPrec :: Int -> ReadS GlobalCluster
$creadsPrec :: Int -> ReadS GlobalCluster
Prelude.Read, Int -> GlobalCluster -> ShowS
[GlobalCluster] -> ShowS
GlobalCluster -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GlobalCluster] -> ShowS
$cshowList :: [GlobalCluster] -> ShowS
show :: GlobalCluster -> String
$cshow :: GlobalCluster -> String
showsPrec :: Int -> GlobalCluster -> ShowS
$cshowsPrec :: Int -> GlobalCluster -> ShowS
Prelude.Show, forall x. Rep GlobalCluster x -> GlobalCluster
forall x. GlobalCluster -> Rep GlobalCluster x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GlobalCluster x -> GlobalCluster
$cfrom :: forall x. GlobalCluster -> Rep GlobalCluster x
Prelude.Generic)

-- |
-- Create a value of 'GlobalCluster' 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:
--
-- 'databaseName', 'globalCluster_databaseName' - The default database name within the new global cluster.
--
-- 'deletionProtection', 'globalCluster_deletionProtection' - The deletion protection setting for the new global cluster.
--
-- 'engine', 'globalCluster_engine' - The Amazon DocumentDB database engine used by the global cluster.
--
-- 'engineVersion', 'globalCluster_engineVersion' - Indicates the database engine version.
--
-- 'globalClusterArn', 'globalCluster_globalClusterArn' - The Amazon Resource Name (ARN) for the global cluster.
--
-- 'globalClusterIdentifier', 'globalCluster_globalClusterIdentifier' - Contains a user-supplied global cluster identifier. This identifier is
-- the unique key that identifies a global cluster.
--
-- 'globalClusterMembers', 'globalCluster_globalClusterMembers' - The list of cluster IDs for secondary clusters within the global
-- cluster. Currently limited to one item.
--
-- 'globalClusterResourceId', 'globalCluster_globalClusterResourceId' - The Amazon Web Services Region-unique, immutable identifier for the
-- global database cluster. This identifier is found in AWS CloudTrail log
-- entries whenever the AWS KMS customer master key (CMK) for the cluster
-- is accessed.
--
-- 'status', 'globalCluster_status' - Specifies the current state of this global cluster.
--
-- 'storageEncrypted', 'globalCluster_storageEncrypted' - The storage encryption setting for the global cluster.
newGlobalCluster ::
  GlobalCluster
newGlobalCluster :: GlobalCluster
newGlobalCluster =
  GlobalCluster'
    { $sel:databaseName:GlobalCluster' :: Maybe Text
databaseName = forall a. Maybe a
Prelude.Nothing,
      $sel:deletionProtection:GlobalCluster' :: Maybe Bool
deletionProtection = forall a. Maybe a
Prelude.Nothing,
      $sel:engine:GlobalCluster' :: Maybe Text
engine = forall a. Maybe a
Prelude.Nothing,
      $sel:engineVersion:GlobalCluster' :: Maybe Text
engineVersion = forall a. Maybe a
Prelude.Nothing,
      $sel:globalClusterArn:GlobalCluster' :: Maybe Text
globalClusterArn = forall a. Maybe a
Prelude.Nothing,
      $sel:globalClusterIdentifier:GlobalCluster' :: Maybe Text
globalClusterIdentifier = forall a. Maybe a
Prelude.Nothing,
      $sel:globalClusterMembers:GlobalCluster' :: Maybe [GlobalClusterMember]
globalClusterMembers = forall a. Maybe a
Prelude.Nothing,
      $sel:globalClusterResourceId:GlobalCluster' :: Maybe Text
globalClusterResourceId = forall a. Maybe a
Prelude.Nothing,
      $sel:status:GlobalCluster' :: Maybe Text
status = forall a. Maybe a
Prelude.Nothing,
      $sel:storageEncrypted:GlobalCluster' :: Maybe Bool
storageEncrypted = forall a. Maybe a
Prelude.Nothing
    }

-- | The default database name within the new global cluster.
globalCluster_databaseName :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Text)
globalCluster_databaseName :: Lens' GlobalCluster (Maybe Text)
globalCluster_databaseName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Text
databaseName :: Maybe Text
$sel:databaseName:GlobalCluster' :: GlobalCluster -> Maybe Text
databaseName} -> Maybe Text
databaseName) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Text
a -> GlobalCluster
s {$sel:databaseName:GlobalCluster' :: Maybe Text
databaseName = Maybe Text
a} :: GlobalCluster)

-- | The deletion protection setting for the new global cluster.
globalCluster_deletionProtection :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Bool)
globalCluster_deletionProtection :: Lens' GlobalCluster (Maybe Bool)
globalCluster_deletionProtection = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Bool
deletionProtection :: Maybe Bool
$sel:deletionProtection:GlobalCluster' :: GlobalCluster -> Maybe Bool
deletionProtection} -> Maybe Bool
deletionProtection) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Bool
a -> GlobalCluster
s {$sel:deletionProtection:GlobalCluster' :: Maybe Bool
deletionProtection = Maybe Bool
a} :: GlobalCluster)

-- | The Amazon DocumentDB database engine used by the global cluster.
globalCluster_engine :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Text)
globalCluster_engine :: Lens' GlobalCluster (Maybe Text)
globalCluster_engine = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Text
engine :: Maybe Text
$sel:engine:GlobalCluster' :: GlobalCluster -> Maybe Text
engine} -> Maybe Text
engine) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Text
a -> GlobalCluster
s {$sel:engine:GlobalCluster' :: Maybe Text
engine = Maybe Text
a} :: GlobalCluster)

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

-- | The Amazon Resource Name (ARN) for the global cluster.
globalCluster_globalClusterArn :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Text)
globalCluster_globalClusterArn :: Lens' GlobalCluster (Maybe Text)
globalCluster_globalClusterArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Text
globalClusterArn :: Maybe Text
$sel:globalClusterArn:GlobalCluster' :: GlobalCluster -> Maybe Text
globalClusterArn} -> Maybe Text
globalClusterArn) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Text
a -> GlobalCluster
s {$sel:globalClusterArn:GlobalCluster' :: Maybe Text
globalClusterArn = Maybe Text
a} :: GlobalCluster)

-- | Contains a user-supplied global cluster identifier. This identifier is
-- the unique key that identifies a global cluster.
globalCluster_globalClusterIdentifier :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Text)
globalCluster_globalClusterIdentifier :: Lens' GlobalCluster (Maybe Text)
globalCluster_globalClusterIdentifier = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Text
globalClusterIdentifier :: Maybe Text
$sel:globalClusterIdentifier:GlobalCluster' :: GlobalCluster -> Maybe Text
globalClusterIdentifier} -> Maybe Text
globalClusterIdentifier) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Text
a -> GlobalCluster
s {$sel:globalClusterIdentifier:GlobalCluster' :: Maybe Text
globalClusterIdentifier = Maybe Text
a} :: GlobalCluster)

-- | The list of cluster IDs for secondary clusters within the global
-- cluster. Currently limited to one item.
globalCluster_globalClusterMembers :: Lens.Lens' GlobalCluster (Prelude.Maybe [GlobalClusterMember])
globalCluster_globalClusterMembers :: Lens' GlobalCluster (Maybe [GlobalClusterMember])
globalCluster_globalClusterMembers = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe [GlobalClusterMember]
globalClusterMembers :: Maybe [GlobalClusterMember]
$sel:globalClusterMembers:GlobalCluster' :: GlobalCluster -> Maybe [GlobalClusterMember]
globalClusterMembers} -> Maybe [GlobalClusterMember]
globalClusterMembers) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe [GlobalClusterMember]
a -> GlobalCluster
s {$sel:globalClusterMembers:GlobalCluster' :: Maybe [GlobalClusterMember]
globalClusterMembers = Maybe [GlobalClusterMember]
a} :: GlobalCluster) 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 Amazon Web Services Region-unique, immutable identifier for the
-- global database cluster. This identifier is found in AWS CloudTrail log
-- entries whenever the AWS KMS customer master key (CMK) for the cluster
-- is accessed.
globalCluster_globalClusterResourceId :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Text)
globalCluster_globalClusterResourceId :: Lens' GlobalCluster (Maybe Text)
globalCluster_globalClusterResourceId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Text
globalClusterResourceId :: Maybe Text
$sel:globalClusterResourceId:GlobalCluster' :: GlobalCluster -> Maybe Text
globalClusterResourceId} -> Maybe Text
globalClusterResourceId) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Text
a -> GlobalCluster
s {$sel:globalClusterResourceId:GlobalCluster' :: Maybe Text
globalClusterResourceId = Maybe Text
a} :: GlobalCluster)

-- | Specifies the current state of this global cluster.
globalCluster_status :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Text)
globalCluster_status :: Lens' GlobalCluster (Maybe Text)
globalCluster_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Text
status :: Maybe Text
$sel:status:GlobalCluster' :: GlobalCluster -> Maybe Text
status} -> Maybe Text
status) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Text
a -> GlobalCluster
s {$sel:status:GlobalCluster' :: Maybe Text
status = Maybe Text
a} :: GlobalCluster)

-- | The storage encryption setting for the global cluster.
globalCluster_storageEncrypted :: Lens.Lens' GlobalCluster (Prelude.Maybe Prelude.Bool)
globalCluster_storageEncrypted :: Lens' GlobalCluster (Maybe Bool)
globalCluster_storageEncrypted = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GlobalCluster' {Maybe Bool
storageEncrypted :: Maybe Bool
$sel:storageEncrypted:GlobalCluster' :: GlobalCluster -> Maybe Bool
storageEncrypted} -> Maybe Bool
storageEncrypted) (\s :: GlobalCluster
s@GlobalCluster' {} Maybe Bool
a -> GlobalCluster
s {$sel:storageEncrypted:GlobalCluster' :: Maybe Bool
storageEncrypted = Maybe Bool
a} :: GlobalCluster)

instance Data.FromXML GlobalCluster where
  parseXML :: [Node] -> Either String GlobalCluster
parseXML [Node]
x =
    Maybe Text
-> Maybe Bool
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe [GlobalClusterMember]
-> Maybe Text
-> Maybe Text
-> Maybe Bool
-> GlobalCluster
GlobalCluster'
      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
"DatabaseName")
      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
"DeletionProtection")
      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
"Engine")
      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
"GlobalClusterArn")
      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
"GlobalClusterIdentifier")
      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
"GlobalClusterMembers"
                      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
"GlobalClusterMember")
                  )
      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
"GlobalClusterResourceId")
      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
"Status")
      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
"StorageEncrypted")

instance Prelude.Hashable GlobalCluster where
  hashWithSalt :: Int -> GlobalCluster -> Int
hashWithSalt Int
_salt GlobalCluster' {Maybe Bool
Maybe [GlobalClusterMember]
Maybe Text
storageEncrypted :: Maybe Bool
status :: Maybe Text
globalClusterResourceId :: Maybe Text
globalClusterMembers :: Maybe [GlobalClusterMember]
globalClusterIdentifier :: Maybe Text
globalClusterArn :: Maybe Text
engineVersion :: Maybe Text
engine :: Maybe Text
deletionProtection :: Maybe Bool
databaseName :: Maybe Text
$sel:storageEncrypted:GlobalCluster' :: GlobalCluster -> Maybe Bool
$sel:status:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:globalClusterResourceId:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:globalClusterMembers:GlobalCluster' :: GlobalCluster -> Maybe [GlobalClusterMember]
$sel:globalClusterIdentifier:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:globalClusterArn:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:engineVersion:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:engine:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:deletionProtection:GlobalCluster' :: GlobalCluster -> Maybe Bool
$sel:databaseName:GlobalCluster' :: GlobalCluster -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
databaseName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
deletionProtection
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
engine
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
engineVersion
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
globalClusterArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
globalClusterIdentifier
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [GlobalClusterMember]
globalClusterMembers
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
globalClusterResourceId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
status
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
storageEncrypted

instance Prelude.NFData GlobalCluster where
  rnf :: GlobalCluster -> ()
rnf GlobalCluster' {Maybe Bool
Maybe [GlobalClusterMember]
Maybe Text
storageEncrypted :: Maybe Bool
status :: Maybe Text
globalClusterResourceId :: Maybe Text
globalClusterMembers :: Maybe [GlobalClusterMember]
globalClusterIdentifier :: Maybe Text
globalClusterArn :: Maybe Text
engineVersion :: Maybe Text
engine :: Maybe Text
deletionProtection :: Maybe Bool
databaseName :: Maybe Text
$sel:storageEncrypted:GlobalCluster' :: GlobalCluster -> Maybe Bool
$sel:status:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:globalClusterResourceId:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:globalClusterMembers:GlobalCluster' :: GlobalCluster -> Maybe [GlobalClusterMember]
$sel:globalClusterIdentifier:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:globalClusterArn:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:engineVersion:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:engine:GlobalCluster' :: GlobalCluster -> Maybe Text
$sel:deletionProtection:GlobalCluster' :: GlobalCluster -> Maybe Bool
$sel:databaseName:GlobalCluster' :: GlobalCluster -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
databaseName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
deletionProtection
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
engine
      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 Text
globalClusterArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
globalClusterIdentifier
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [GlobalClusterMember]
globalClusterMembers
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
globalClusterResourceId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
storageEncrypted