{-# 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.DMS.Types.TableStatistics
-- 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.DMS.Types.TableStatistics 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

-- | Provides a collection of table statistics in response to a request by
-- the @DescribeTableStatistics@ operation.
--
-- /See:/ 'newTableStatistics' smart constructor.
data TableStatistics = TableStatistics'
  { -- | The number of data definition language (DDL) statements used to build
    -- and modify the structure of your tables applied on the target.
    TableStatistics -> Maybe Integer
appliedDdls :: Prelude.Maybe Prelude.Integer,
    -- | The number of delete actions applied on a target table.
    TableStatistics -> Maybe Integer
appliedDeletes :: Prelude.Maybe Prelude.Integer,
    -- | The number of insert actions applied on a target table.
    TableStatistics -> Maybe Integer
appliedInserts :: Prelude.Maybe Prelude.Integer,
    -- | The number of update actions applied on a target table.
    TableStatistics -> Maybe Integer
appliedUpdates :: Prelude.Maybe Prelude.Integer,
    -- | The data definition language (DDL) used to build and modify the
    -- structure of your tables.
    TableStatistics -> Maybe Integer
ddls :: Prelude.Maybe Prelude.Integer,
    -- | The number of delete actions performed on a table.
    TableStatistics -> Maybe Integer
deletes :: Prelude.Maybe Prelude.Integer,
    -- | The number of rows that failed conditional checks during the full load
    -- operation (valid only for migrations where DynamoDB is the target).
    TableStatistics -> Maybe Integer
fullLoadCondtnlChkFailedRows :: Prelude.Maybe Prelude.Integer,
    -- | The time when the full load operation completed.
    TableStatistics -> Maybe POSIX
fullLoadEndTime :: Prelude.Maybe Data.POSIX,
    -- | The number of rows that failed to load during the full load operation
    -- (valid only for migrations where DynamoDB is the target).
    TableStatistics -> Maybe Integer
fullLoadErrorRows :: Prelude.Maybe Prelude.Integer,
    -- | A value that indicates if the table was reloaded (@true@) or loaded as
    -- part of a new full load operation (@false@).
    TableStatistics -> Maybe Bool
fullLoadReloaded :: Prelude.Maybe Prelude.Bool,
    -- | The number of rows added during the full load operation.
    TableStatistics -> Maybe Integer
fullLoadRows :: Prelude.Maybe Prelude.Integer,
    -- | The time when the full load operation started.
    TableStatistics -> Maybe POSIX
fullLoadStartTime :: Prelude.Maybe Data.POSIX,
    -- | The number of insert actions performed on a table.
    TableStatistics -> Maybe Integer
inserts :: Prelude.Maybe Prelude.Integer,
    -- | The last time a table was updated.
    TableStatistics -> Maybe POSIX
lastUpdateTime :: Prelude.Maybe Data.POSIX,
    -- | The schema name.
    TableStatistics -> Maybe Text
schemaName :: Prelude.Maybe Prelude.Text,
    -- | The name of the table.
    TableStatistics -> Maybe Text
tableName :: Prelude.Maybe Prelude.Text,
    -- | The state of the tables described.
    --
    -- Valid states: Table does not exist | Before load | Full load | Table
    -- completed | Table cancelled | Table error | Table is being reloaded
    TableStatistics -> Maybe Text
tableState :: Prelude.Maybe Prelude.Text,
    -- | The number of update actions performed on a table.
    TableStatistics -> Maybe Integer
updates :: Prelude.Maybe Prelude.Integer,
    -- | The number of records that failed validation.
    TableStatistics -> Maybe Integer
validationFailedRecords :: Prelude.Maybe Prelude.Integer,
    -- | The number of records that have yet to be validated.
    TableStatistics -> Maybe Integer
validationPendingRecords :: Prelude.Maybe Prelude.Integer,
    -- | The validation state of the table.
    --
    -- This parameter can have the following values:
    --
    -- -   Not enabled – Validation isn\'t enabled for the table in the
    --     migration task.
    --
    -- -   Pending records – Some records in the table are waiting for
    --     validation.
    --
    -- -   Mismatched records – Some records in the table don\'t match between
    --     the source and target.
    --
    -- -   Suspended records – Some records in the table couldn\'t be
    --     validated.
    --
    -- -   No primary key –The table couldn\'t be validated because it has no
    --     primary key.
    --
    -- -   Table error – The table wasn\'t validated because it\'s in an error
    --     state and some data wasn\'t migrated.
    --
    -- -   Validated – All rows in the table are validated. If the table is
    --     updated, the status can change from Validated.
    --
    -- -   Error – The table couldn\'t be validated because of an unexpected
    --     error.
    --
    -- -   Pending validation – The table is waiting validation.
    --
    -- -   Preparing table – Preparing the table enabled in the migration task
    --     for validation.
    --
    -- -   Pending revalidation – All rows in the table are pending validation
    --     after the table was updated.
    TableStatistics -> Maybe Text
validationState :: Prelude.Maybe Prelude.Text,
    -- | Additional details about the state of validation.
    TableStatistics -> Maybe Text
validationStateDetails :: Prelude.Maybe Prelude.Text,
    -- | The number of records that couldn\'t be validated.
    TableStatistics -> Maybe Integer
validationSuspendedRecords :: Prelude.Maybe Prelude.Integer
  }
  deriving (TableStatistics -> TableStatistics -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TableStatistics -> TableStatistics -> Bool
$c/= :: TableStatistics -> TableStatistics -> Bool
== :: TableStatistics -> TableStatistics -> Bool
$c== :: TableStatistics -> TableStatistics -> Bool
Prelude.Eq, ReadPrec [TableStatistics]
ReadPrec TableStatistics
Int -> ReadS TableStatistics
ReadS [TableStatistics]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [TableStatistics]
$creadListPrec :: ReadPrec [TableStatistics]
readPrec :: ReadPrec TableStatistics
$creadPrec :: ReadPrec TableStatistics
readList :: ReadS [TableStatistics]
$creadList :: ReadS [TableStatistics]
readsPrec :: Int -> ReadS TableStatistics
$creadsPrec :: Int -> ReadS TableStatistics
Prelude.Read, Int -> TableStatistics -> ShowS
[TableStatistics] -> ShowS
TableStatistics -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TableStatistics] -> ShowS
$cshowList :: [TableStatistics] -> ShowS
show :: TableStatistics -> String
$cshow :: TableStatistics -> String
showsPrec :: Int -> TableStatistics -> ShowS
$cshowsPrec :: Int -> TableStatistics -> ShowS
Prelude.Show, forall x. Rep TableStatistics x -> TableStatistics
forall x. TableStatistics -> Rep TableStatistics x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep TableStatistics x -> TableStatistics
$cfrom :: forall x. TableStatistics -> Rep TableStatistics x
Prelude.Generic)

-- |
-- Create a value of 'TableStatistics' 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:
--
-- 'appliedDdls', 'tableStatistics_appliedDdls' - The number of data definition language (DDL) statements used to build
-- and modify the structure of your tables applied on the target.
--
-- 'appliedDeletes', 'tableStatistics_appliedDeletes' - The number of delete actions applied on a target table.
--
-- 'appliedInserts', 'tableStatistics_appliedInserts' - The number of insert actions applied on a target table.
--
-- 'appliedUpdates', 'tableStatistics_appliedUpdates' - The number of update actions applied on a target table.
--
-- 'ddls', 'tableStatistics_ddls' - The data definition language (DDL) used to build and modify the
-- structure of your tables.
--
-- 'deletes', 'tableStatistics_deletes' - The number of delete actions performed on a table.
--
-- 'fullLoadCondtnlChkFailedRows', 'tableStatistics_fullLoadCondtnlChkFailedRows' - The number of rows that failed conditional checks during the full load
-- operation (valid only for migrations where DynamoDB is the target).
--
-- 'fullLoadEndTime', 'tableStatistics_fullLoadEndTime' - The time when the full load operation completed.
--
-- 'fullLoadErrorRows', 'tableStatistics_fullLoadErrorRows' - The number of rows that failed to load during the full load operation
-- (valid only for migrations where DynamoDB is the target).
--
-- 'fullLoadReloaded', 'tableStatistics_fullLoadReloaded' - A value that indicates if the table was reloaded (@true@) or loaded as
-- part of a new full load operation (@false@).
--
-- 'fullLoadRows', 'tableStatistics_fullLoadRows' - The number of rows added during the full load operation.
--
-- 'fullLoadStartTime', 'tableStatistics_fullLoadStartTime' - The time when the full load operation started.
--
-- 'inserts', 'tableStatistics_inserts' - The number of insert actions performed on a table.
--
-- 'lastUpdateTime', 'tableStatistics_lastUpdateTime' - The last time a table was updated.
--
-- 'schemaName', 'tableStatistics_schemaName' - The schema name.
--
-- 'tableName', 'tableStatistics_tableName' - The name of the table.
--
-- 'tableState', 'tableStatistics_tableState' - The state of the tables described.
--
-- Valid states: Table does not exist | Before load | Full load | Table
-- completed | Table cancelled | Table error | Table is being reloaded
--
-- 'updates', 'tableStatistics_updates' - The number of update actions performed on a table.
--
-- 'validationFailedRecords', 'tableStatistics_validationFailedRecords' - The number of records that failed validation.
--
-- 'validationPendingRecords', 'tableStatistics_validationPendingRecords' - The number of records that have yet to be validated.
--
-- 'validationState', 'tableStatistics_validationState' - The validation state of the table.
--
-- This parameter can have the following values:
--
-- -   Not enabled – Validation isn\'t enabled for the table in the
--     migration task.
--
-- -   Pending records – Some records in the table are waiting for
--     validation.
--
-- -   Mismatched records – Some records in the table don\'t match between
--     the source and target.
--
-- -   Suspended records – Some records in the table couldn\'t be
--     validated.
--
-- -   No primary key –The table couldn\'t be validated because it has no
--     primary key.
--
-- -   Table error – The table wasn\'t validated because it\'s in an error
--     state and some data wasn\'t migrated.
--
-- -   Validated – All rows in the table are validated. If the table is
--     updated, the status can change from Validated.
--
-- -   Error – The table couldn\'t be validated because of an unexpected
--     error.
--
-- -   Pending validation – The table is waiting validation.
--
-- -   Preparing table – Preparing the table enabled in the migration task
--     for validation.
--
-- -   Pending revalidation – All rows in the table are pending validation
--     after the table was updated.
--
-- 'validationStateDetails', 'tableStatistics_validationStateDetails' - Additional details about the state of validation.
--
-- 'validationSuspendedRecords', 'tableStatistics_validationSuspendedRecords' - The number of records that couldn\'t be validated.
newTableStatistics ::
  TableStatistics
newTableStatistics :: TableStatistics
newTableStatistics =
  TableStatistics'
    { $sel:appliedDdls:TableStatistics' :: Maybe Integer
appliedDdls = forall a. Maybe a
Prelude.Nothing,
      $sel:appliedDeletes:TableStatistics' :: Maybe Integer
appliedDeletes = forall a. Maybe a
Prelude.Nothing,
      $sel:appliedInserts:TableStatistics' :: Maybe Integer
appliedInserts = forall a. Maybe a
Prelude.Nothing,
      $sel:appliedUpdates:TableStatistics' :: Maybe Integer
appliedUpdates = forall a. Maybe a
Prelude.Nothing,
      $sel:ddls:TableStatistics' :: Maybe Integer
ddls = forall a. Maybe a
Prelude.Nothing,
      $sel:deletes:TableStatistics' :: Maybe Integer
deletes = forall a. Maybe a
Prelude.Nothing,
      $sel:fullLoadCondtnlChkFailedRows:TableStatistics' :: Maybe Integer
fullLoadCondtnlChkFailedRows = forall a. Maybe a
Prelude.Nothing,
      $sel:fullLoadEndTime:TableStatistics' :: Maybe POSIX
fullLoadEndTime = forall a. Maybe a
Prelude.Nothing,
      $sel:fullLoadErrorRows:TableStatistics' :: Maybe Integer
fullLoadErrorRows = forall a. Maybe a
Prelude.Nothing,
      $sel:fullLoadReloaded:TableStatistics' :: Maybe Bool
fullLoadReloaded = forall a. Maybe a
Prelude.Nothing,
      $sel:fullLoadRows:TableStatistics' :: Maybe Integer
fullLoadRows = forall a. Maybe a
Prelude.Nothing,
      $sel:fullLoadStartTime:TableStatistics' :: Maybe POSIX
fullLoadStartTime = forall a. Maybe a
Prelude.Nothing,
      $sel:inserts:TableStatistics' :: Maybe Integer
inserts = forall a. Maybe a
Prelude.Nothing,
      $sel:lastUpdateTime:TableStatistics' :: Maybe POSIX
lastUpdateTime = forall a. Maybe a
Prelude.Nothing,
      $sel:schemaName:TableStatistics' :: Maybe Text
schemaName = forall a. Maybe a
Prelude.Nothing,
      $sel:tableName:TableStatistics' :: Maybe Text
tableName = forall a. Maybe a
Prelude.Nothing,
      $sel:tableState:TableStatistics' :: Maybe Text
tableState = forall a. Maybe a
Prelude.Nothing,
      $sel:updates:TableStatistics' :: Maybe Integer
updates = forall a. Maybe a
Prelude.Nothing,
      $sel:validationFailedRecords:TableStatistics' :: Maybe Integer
validationFailedRecords = forall a. Maybe a
Prelude.Nothing,
      $sel:validationPendingRecords:TableStatistics' :: Maybe Integer
validationPendingRecords = forall a. Maybe a
Prelude.Nothing,
      $sel:validationState:TableStatistics' :: Maybe Text
validationState = forall a. Maybe a
Prelude.Nothing,
      $sel:validationStateDetails:TableStatistics' :: Maybe Text
validationStateDetails = forall a. Maybe a
Prelude.Nothing,
      $sel:validationSuspendedRecords:TableStatistics' :: Maybe Integer
validationSuspendedRecords = forall a. Maybe a
Prelude.Nothing
    }

-- | The number of data definition language (DDL) statements used to build
-- and modify the structure of your tables applied on the target.
tableStatistics_appliedDdls :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_appliedDdls :: Lens' TableStatistics (Maybe Integer)
tableStatistics_appliedDdls = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
appliedDdls :: Maybe Integer
$sel:appliedDdls:TableStatistics' :: TableStatistics -> Maybe Integer
appliedDdls} -> Maybe Integer
appliedDdls) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:appliedDdls:TableStatistics' :: Maybe Integer
appliedDdls = Maybe Integer
a} :: TableStatistics)

-- | The number of delete actions applied on a target table.
tableStatistics_appliedDeletes :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_appliedDeletes :: Lens' TableStatistics (Maybe Integer)
tableStatistics_appliedDeletes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
appliedDeletes :: Maybe Integer
$sel:appliedDeletes:TableStatistics' :: TableStatistics -> Maybe Integer
appliedDeletes} -> Maybe Integer
appliedDeletes) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:appliedDeletes:TableStatistics' :: Maybe Integer
appliedDeletes = Maybe Integer
a} :: TableStatistics)

-- | The number of insert actions applied on a target table.
tableStatistics_appliedInserts :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_appliedInserts :: Lens' TableStatistics (Maybe Integer)
tableStatistics_appliedInserts = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
appliedInserts :: Maybe Integer
$sel:appliedInserts:TableStatistics' :: TableStatistics -> Maybe Integer
appliedInserts} -> Maybe Integer
appliedInserts) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:appliedInserts:TableStatistics' :: Maybe Integer
appliedInserts = Maybe Integer
a} :: TableStatistics)

-- | The number of update actions applied on a target table.
tableStatistics_appliedUpdates :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_appliedUpdates :: Lens' TableStatistics (Maybe Integer)
tableStatistics_appliedUpdates = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
appliedUpdates :: Maybe Integer
$sel:appliedUpdates:TableStatistics' :: TableStatistics -> Maybe Integer
appliedUpdates} -> Maybe Integer
appliedUpdates) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:appliedUpdates:TableStatistics' :: Maybe Integer
appliedUpdates = Maybe Integer
a} :: TableStatistics)

-- | The data definition language (DDL) used to build and modify the
-- structure of your tables.
tableStatistics_ddls :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_ddls :: Lens' TableStatistics (Maybe Integer)
tableStatistics_ddls = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
ddls :: Maybe Integer
$sel:ddls:TableStatistics' :: TableStatistics -> Maybe Integer
ddls} -> Maybe Integer
ddls) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:ddls:TableStatistics' :: Maybe Integer
ddls = Maybe Integer
a} :: TableStatistics)

-- | The number of delete actions performed on a table.
tableStatistics_deletes :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_deletes :: Lens' TableStatistics (Maybe Integer)
tableStatistics_deletes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
deletes :: Maybe Integer
$sel:deletes:TableStatistics' :: TableStatistics -> Maybe Integer
deletes} -> Maybe Integer
deletes) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:deletes:TableStatistics' :: Maybe Integer
deletes = Maybe Integer
a} :: TableStatistics)

-- | The number of rows that failed conditional checks during the full load
-- operation (valid only for migrations where DynamoDB is the target).
tableStatistics_fullLoadCondtnlChkFailedRows :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_fullLoadCondtnlChkFailedRows :: Lens' TableStatistics (Maybe Integer)
tableStatistics_fullLoadCondtnlChkFailedRows = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
fullLoadCondtnlChkFailedRows :: Maybe Integer
$sel:fullLoadCondtnlChkFailedRows:TableStatistics' :: TableStatistics -> Maybe Integer
fullLoadCondtnlChkFailedRows} -> Maybe Integer
fullLoadCondtnlChkFailedRows) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:fullLoadCondtnlChkFailedRows:TableStatistics' :: Maybe Integer
fullLoadCondtnlChkFailedRows = Maybe Integer
a} :: TableStatistics)

-- | The time when the full load operation completed.
tableStatistics_fullLoadEndTime :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.UTCTime)
tableStatistics_fullLoadEndTime :: Lens' TableStatistics (Maybe UTCTime)
tableStatistics_fullLoadEndTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe POSIX
fullLoadEndTime :: Maybe POSIX
$sel:fullLoadEndTime:TableStatistics' :: TableStatistics -> Maybe POSIX
fullLoadEndTime} -> Maybe POSIX
fullLoadEndTime) (\s :: TableStatistics
s@TableStatistics' {} Maybe POSIX
a -> TableStatistics
s {$sel:fullLoadEndTime:TableStatistics' :: Maybe POSIX
fullLoadEndTime = Maybe POSIX
a} :: TableStatistics) 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 number of rows that failed to load during the full load operation
-- (valid only for migrations where DynamoDB is the target).
tableStatistics_fullLoadErrorRows :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_fullLoadErrorRows :: Lens' TableStatistics (Maybe Integer)
tableStatistics_fullLoadErrorRows = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
fullLoadErrorRows :: Maybe Integer
$sel:fullLoadErrorRows:TableStatistics' :: TableStatistics -> Maybe Integer
fullLoadErrorRows} -> Maybe Integer
fullLoadErrorRows) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:fullLoadErrorRows:TableStatistics' :: Maybe Integer
fullLoadErrorRows = Maybe Integer
a} :: TableStatistics)

-- | A value that indicates if the table was reloaded (@true@) or loaded as
-- part of a new full load operation (@false@).
tableStatistics_fullLoadReloaded :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Bool)
tableStatistics_fullLoadReloaded :: Lens' TableStatistics (Maybe Bool)
tableStatistics_fullLoadReloaded = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Bool
fullLoadReloaded :: Maybe Bool
$sel:fullLoadReloaded:TableStatistics' :: TableStatistics -> Maybe Bool
fullLoadReloaded} -> Maybe Bool
fullLoadReloaded) (\s :: TableStatistics
s@TableStatistics' {} Maybe Bool
a -> TableStatistics
s {$sel:fullLoadReloaded:TableStatistics' :: Maybe Bool
fullLoadReloaded = Maybe Bool
a} :: TableStatistics)

-- | The number of rows added during the full load operation.
tableStatistics_fullLoadRows :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_fullLoadRows :: Lens' TableStatistics (Maybe Integer)
tableStatistics_fullLoadRows = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
fullLoadRows :: Maybe Integer
$sel:fullLoadRows:TableStatistics' :: TableStatistics -> Maybe Integer
fullLoadRows} -> Maybe Integer
fullLoadRows) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:fullLoadRows:TableStatistics' :: Maybe Integer
fullLoadRows = Maybe Integer
a} :: TableStatistics)

-- | The time when the full load operation started.
tableStatistics_fullLoadStartTime :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.UTCTime)
tableStatistics_fullLoadStartTime :: Lens' TableStatistics (Maybe UTCTime)
tableStatistics_fullLoadStartTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe POSIX
fullLoadStartTime :: Maybe POSIX
$sel:fullLoadStartTime:TableStatistics' :: TableStatistics -> Maybe POSIX
fullLoadStartTime} -> Maybe POSIX
fullLoadStartTime) (\s :: TableStatistics
s@TableStatistics' {} Maybe POSIX
a -> TableStatistics
s {$sel:fullLoadStartTime:TableStatistics' :: Maybe POSIX
fullLoadStartTime = Maybe POSIX
a} :: TableStatistics) 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 number of insert actions performed on a table.
tableStatistics_inserts :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_inserts :: Lens' TableStatistics (Maybe Integer)
tableStatistics_inserts = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
inserts :: Maybe Integer
$sel:inserts:TableStatistics' :: TableStatistics -> Maybe Integer
inserts} -> Maybe Integer
inserts) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:inserts:TableStatistics' :: Maybe Integer
inserts = Maybe Integer
a} :: TableStatistics)

-- | The last time a table was updated.
tableStatistics_lastUpdateTime :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.UTCTime)
tableStatistics_lastUpdateTime :: Lens' TableStatistics (Maybe UTCTime)
tableStatistics_lastUpdateTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe POSIX
lastUpdateTime :: Maybe POSIX
$sel:lastUpdateTime:TableStatistics' :: TableStatistics -> Maybe POSIX
lastUpdateTime} -> Maybe POSIX
lastUpdateTime) (\s :: TableStatistics
s@TableStatistics' {} Maybe POSIX
a -> TableStatistics
s {$sel:lastUpdateTime:TableStatistics' :: Maybe POSIX
lastUpdateTime = Maybe POSIX
a} :: TableStatistics) 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 schema name.
tableStatistics_schemaName :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Text)
tableStatistics_schemaName :: Lens' TableStatistics (Maybe Text)
tableStatistics_schemaName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Text
schemaName :: Maybe Text
$sel:schemaName:TableStatistics' :: TableStatistics -> Maybe Text
schemaName} -> Maybe Text
schemaName) (\s :: TableStatistics
s@TableStatistics' {} Maybe Text
a -> TableStatistics
s {$sel:schemaName:TableStatistics' :: Maybe Text
schemaName = Maybe Text
a} :: TableStatistics)

-- | The name of the table.
tableStatistics_tableName :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Text)
tableStatistics_tableName :: Lens' TableStatistics (Maybe Text)
tableStatistics_tableName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Text
tableName :: Maybe Text
$sel:tableName:TableStatistics' :: TableStatistics -> Maybe Text
tableName} -> Maybe Text
tableName) (\s :: TableStatistics
s@TableStatistics' {} Maybe Text
a -> TableStatistics
s {$sel:tableName:TableStatistics' :: Maybe Text
tableName = Maybe Text
a} :: TableStatistics)

-- | The state of the tables described.
--
-- Valid states: Table does not exist | Before load | Full load | Table
-- completed | Table cancelled | Table error | Table is being reloaded
tableStatistics_tableState :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Text)
tableStatistics_tableState :: Lens' TableStatistics (Maybe Text)
tableStatistics_tableState = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Text
tableState :: Maybe Text
$sel:tableState:TableStatistics' :: TableStatistics -> Maybe Text
tableState} -> Maybe Text
tableState) (\s :: TableStatistics
s@TableStatistics' {} Maybe Text
a -> TableStatistics
s {$sel:tableState:TableStatistics' :: Maybe Text
tableState = Maybe Text
a} :: TableStatistics)

-- | The number of update actions performed on a table.
tableStatistics_updates :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_updates :: Lens' TableStatistics (Maybe Integer)
tableStatistics_updates = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
updates :: Maybe Integer
$sel:updates:TableStatistics' :: TableStatistics -> Maybe Integer
updates} -> Maybe Integer
updates) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:updates:TableStatistics' :: Maybe Integer
updates = Maybe Integer
a} :: TableStatistics)

-- | The number of records that failed validation.
tableStatistics_validationFailedRecords :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_validationFailedRecords :: Lens' TableStatistics (Maybe Integer)
tableStatistics_validationFailedRecords = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
validationFailedRecords :: Maybe Integer
$sel:validationFailedRecords:TableStatistics' :: TableStatistics -> Maybe Integer
validationFailedRecords} -> Maybe Integer
validationFailedRecords) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:validationFailedRecords:TableStatistics' :: Maybe Integer
validationFailedRecords = Maybe Integer
a} :: TableStatistics)

-- | The number of records that have yet to be validated.
tableStatistics_validationPendingRecords :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_validationPendingRecords :: Lens' TableStatistics (Maybe Integer)
tableStatistics_validationPendingRecords = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
validationPendingRecords :: Maybe Integer
$sel:validationPendingRecords:TableStatistics' :: TableStatistics -> Maybe Integer
validationPendingRecords} -> Maybe Integer
validationPendingRecords) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:validationPendingRecords:TableStatistics' :: Maybe Integer
validationPendingRecords = Maybe Integer
a} :: TableStatistics)

-- | The validation state of the table.
--
-- This parameter can have the following values:
--
-- -   Not enabled – Validation isn\'t enabled for the table in the
--     migration task.
--
-- -   Pending records – Some records in the table are waiting for
--     validation.
--
-- -   Mismatched records – Some records in the table don\'t match between
--     the source and target.
--
-- -   Suspended records – Some records in the table couldn\'t be
--     validated.
--
-- -   No primary key –The table couldn\'t be validated because it has no
--     primary key.
--
-- -   Table error – The table wasn\'t validated because it\'s in an error
--     state and some data wasn\'t migrated.
--
-- -   Validated – All rows in the table are validated. If the table is
--     updated, the status can change from Validated.
--
-- -   Error – The table couldn\'t be validated because of an unexpected
--     error.
--
-- -   Pending validation – The table is waiting validation.
--
-- -   Preparing table – Preparing the table enabled in the migration task
--     for validation.
--
-- -   Pending revalidation – All rows in the table are pending validation
--     after the table was updated.
tableStatistics_validationState :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Text)
tableStatistics_validationState :: Lens' TableStatistics (Maybe Text)
tableStatistics_validationState = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Text
validationState :: Maybe Text
$sel:validationState:TableStatistics' :: TableStatistics -> Maybe Text
validationState} -> Maybe Text
validationState) (\s :: TableStatistics
s@TableStatistics' {} Maybe Text
a -> TableStatistics
s {$sel:validationState:TableStatistics' :: Maybe Text
validationState = Maybe Text
a} :: TableStatistics)

-- | Additional details about the state of validation.
tableStatistics_validationStateDetails :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Text)
tableStatistics_validationStateDetails :: Lens' TableStatistics (Maybe Text)
tableStatistics_validationStateDetails = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Text
validationStateDetails :: Maybe Text
$sel:validationStateDetails:TableStatistics' :: TableStatistics -> Maybe Text
validationStateDetails} -> Maybe Text
validationStateDetails) (\s :: TableStatistics
s@TableStatistics' {} Maybe Text
a -> TableStatistics
s {$sel:validationStateDetails:TableStatistics' :: Maybe Text
validationStateDetails = Maybe Text
a} :: TableStatistics)

-- | The number of records that couldn\'t be validated.
tableStatistics_validationSuspendedRecords :: Lens.Lens' TableStatistics (Prelude.Maybe Prelude.Integer)
tableStatistics_validationSuspendedRecords :: Lens' TableStatistics (Maybe Integer)
tableStatistics_validationSuspendedRecords = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\TableStatistics' {Maybe Integer
validationSuspendedRecords :: Maybe Integer
$sel:validationSuspendedRecords:TableStatistics' :: TableStatistics -> Maybe Integer
validationSuspendedRecords} -> Maybe Integer
validationSuspendedRecords) (\s :: TableStatistics
s@TableStatistics' {} Maybe Integer
a -> TableStatistics
s {$sel:validationSuspendedRecords:TableStatistics' :: Maybe Integer
validationSuspendedRecords = Maybe Integer
a} :: TableStatistics)

instance Data.FromJSON TableStatistics where
  parseJSON :: Value -> Parser TableStatistics
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"TableStatistics"
      ( \Object
x ->
          Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe POSIX
-> Maybe Integer
-> Maybe Bool
-> Maybe Integer
-> Maybe POSIX
-> Maybe Integer
-> Maybe POSIX
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Integer
-> Maybe Integer
-> Maybe Integer
-> Maybe Text
-> Maybe Text
-> Maybe Integer
-> TableStatistics
TableStatistics'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AppliedDdls")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AppliedDeletes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AppliedInserts")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"AppliedUpdates")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Ddls")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Deletes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FullLoadCondtnlChkFailedRows")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FullLoadEndTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FullLoadErrorRows")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FullLoadReloaded")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FullLoadRows")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FullLoadStartTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Inserts")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"LastUpdateTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"SchemaName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"TableName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"TableState")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Updates")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"ValidationFailedRecords")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"ValidationPendingRecords")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"ValidationState")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"ValidationStateDetails")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"ValidationSuspendedRecords")
      )

instance Prelude.Hashable TableStatistics where
  hashWithSalt :: Int -> TableStatistics -> Int
hashWithSalt Int
_salt TableStatistics' {Maybe Bool
Maybe Integer
Maybe Text
Maybe POSIX
validationSuspendedRecords :: Maybe Integer
validationStateDetails :: Maybe Text
validationState :: Maybe Text
validationPendingRecords :: Maybe Integer
validationFailedRecords :: Maybe Integer
updates :: Maybe Integer
tableState :: Maybe Text
tableName :: Maybe Text
schemaName :: Maybe Text
lastUpdateTime :: Maybe POSIX
inserts :: Maybe Integer
fullLoadStartTime :: Maybe POSIX
fullLoadRows :: Maybe Integer
fullLoadReloaded :: Maybe Bool
fullLoadErrorRows :: Maybe Integer
fullLoadEndTime :: Maybe POSIX
fullLoadCondtnlChkFailedRows :: Maybe Integer
deletes :: Maybe Integer
ddls :: Maybe Integer
appliedUpdates :: Maybe Integer
appliedInserts :: Maybe Integer
appliedDeletes :: Maybe Integer
appliedDdls :: Maybe Integer
$sel:validationSuspendedRecords:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:validationStateDetails:TableStatistics' :: TableStatistics -> Maybe Text
$sel:validationState:TableStatistics' :: TableStatistics -> Maybe Text
$sel:validationPendingRecords:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:validationFailedRecords:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:updates:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:tableState:TableStatistics' :: TableStatistics -> Maybe Text
$sel:tableName:TableStatistics' :: TableStatistics -> Maybe Text
$sel:schemaName:TableStatistics' :: TableStatistics -> Maybe Text
$sel:lastUpdateTime:TableStatistics' :: TableStatistics -> Maybe POSIX
$sel:inserts:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:fullLoadStartTime:TableStatistics' :: TableStatistics -> Maybe POSIX
$sel:fullLoadRows:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:fullLoadReloaded:TableStatistics' :: TableStatistics -> Maybe Bool
$sel:fullLoadErrorRows:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:fullLoadEndTime:TableStatistics' :: TableStatistics -> Maybe POSIX
$sel:fullLoadCondtnlChkFailedRows:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:deletes:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:ddls:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedUpdates:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedInserts:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedDeletes:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedDdls:TableStatistics' :: TableStatistics -> Maybe Integer
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
appliedDdls
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
appliedDeletes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
appliedInserts
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
appliedUpdates
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
ddls
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
deletes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
fullLoadCondtnlChkFailedRows
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
fullLoadEndTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
fullLoadErrorRows
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
fullLoadReloaded
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
fullLoadRows
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
fullLoadStartTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
inserts
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
lastUpdateTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
schemaName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tableName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tableState
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
updates
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
validationFailedRecords
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
validationPendingRecords
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
validationState
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
validationStateDetails
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
validationSuspendedRecords

instance Prelude.NFData TableStatistics where
  rnf :: TableStatistics -> ()
rnf TableStatistics' {Maybe Bool
Maybe Integer
Maybe Text
Maybe POSIX
validationSuspendedRecords :: Maybe Integer
validationStateDetails :: Maybe Text
validationState :: Maybe Text
validationPendingRecords :: Maybe Integer
validationFailedRecords :: Maybe Integer
updates :: Maybe Integer
tableState :: Maybe Text
tableName :: Maybe Text
schemaName :: Maybe Text
lastUpdateTime :: Maybe POSIX
inserts :: Maybe Integer
fullLoadStartTime :: Maybe POSIX
fullLoadRows :: Maybe Integer
fullLoadReloaded :: Maybe Bool
fullLoadErrorRows :: Maybe Integer
fullLoadEndTime :: Maybe POSIX
fullLoadCondtnlChkFailedRows :: Maybe Integer
deletes :: Maybe Integer
ddls :: Maybe Integer
appliedUpdates :: Maybe Integer
appliedInserts :: Maybe Integer
appliedDeletes :: Maybe Integer
appliedDdls :: Maybe Integer
$sel:validationSuspendedRecords:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:validationStateDetails:TableStatistics' :: TableStatistics -> Maybe Text
$sel:validationState:TableStatistics' :: TableStatistics -> Maybe Text
$sel:validationPendingRecords:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:validationFailedRecords:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:updates:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:tableState:TableStatistics' :: TableStatistics -> Maybe Text
$sel:tableName:TableStatistics' :: TableStatistics -> Maybe Text
$sel:schemaName:TableStatistics' :: TableStatistics -> Maybe Text
$sel:lastUpdateTime:TableStatistics' :: TableStatistics -> Maybe POSIX
$sel:inserts:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:fullLoadStartTime:TableStatistics' :: TableStatistics -> Maybe POSIX
$sel:fullLoadRows:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:fullLoadReloaded:TableStatistics' :: TableStatistics -> Maybe Bool
$sel:fullLoadErrorRows:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:fullLoadEndTime:TableStatistics' :: TableStatistics -> Maybe POSIX
$sel:fullLoadCondtnlChkFailedRows:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:deletes:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:ddls:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedUpdates:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedInserts:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedDeletes:TableStatistics' :: TableStatistics -> Maybe Integer
$sel:appliedDdls:TableStatistics' :: TableStatistics -> Maybe Integer
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
appliedDdls
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
appliedDeletes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
appliedInserts
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
appliedUpdates
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
ddls
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
deletes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
fullLoadCondtnlChkFailedRows
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
fullLoadEndTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
fullLoadErrorRows
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
fullLoadReloaded
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
fullLoadRows
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
fullLoadStartTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
inserts
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
lastUpdateTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
schemaName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tableName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tableState
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
updates
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Integer
validationFailedRecords
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Integer
validationPendingRecords
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
validationState
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Text
validationStateDetails
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe Integer
validationSuspendedRecords