{-# 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.StorageGateway.Types.Tape
-- 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.StorageGateway.Types.Tape 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

-- | Describes a virtual tape object.
--
-- /See:/ 'newTape' smart constructor.
data Tape = Tape'
  { Tape -> Maybe Text
kmsKey :: Prelude.Maybe Prelude.Text,
    -- | The date that the tape enters a custom tape pool.
    Tape -> Maybe POSIX
poolEntryDate :: Prelude.Maybe Data.POSIX,
    -- | The ID of the pool that contains tapes that will be archived. The tapes
    -- in this pool are archived in the S3 storage class that is associated
    -- with the pool. When you use your backup application to eject the tape,
    -- the tape is archived directly into the storage class (S3 Glacier or S3
    -- Glacier Deep Archive) that corresponds to the pool.
    Tape -> Maybe Text
poolId :: Prelude.Maybe Prelude.Text,
    -- | For archiving virtual tapes, indicates how much data remains to be
    -- uploaded before archiving is complete.
    --
    -- Range: 0 (not started) to 100 (complete).
    Tape -> Maybe Double
progress :: Prelude.Maybe Prelude.Double,
    -- | The date that the tape is first archived with tape retention lock
    -- enabled.
    Tape -> Maybe POSIX
retentionStartDate :: Prelude.Maybe Data.POSIX,
    -- | The Amazon Resource Name (ARN) of the virtual tape.
    Tape -> Maybe Text
tapeARN :: Prelude.Maybe Prelude.Text,
    -- | The barcode that identifies a specific virtual tape.
    Tape -> Maybe Text
tapeBarcode :: Prelude.Maybe Prelude.Text,
    -- | The date the virtual tape was created.
    Tape -> Maybe POSIX
tapeCreatedDate :: Prelude.Maybe Data.POSIX,
    -- | The size, in bytes, of the virtual tape capacity.
    Tape -> Maybe Integer
tapeSizeInBytes :: Prelude.Maybe Prelude.Integer,
    -- | The current state of the virtual tape.
    Tape -> Maybe Text
tapeStatus :: Prelude.Maybe Prelude.Text,
    -- | The size, in bytes, of data stored on the virtual tape.
    --
    -- This value is not available for tapes created prior to May 13, 2015.
    Tape -> Maybe Integer
tapeUsedInBytes :: Prelude.Maybe Prelude.Integer,
    -- | The virtual tape library (VTL) device that the virtual tape is
    -- associated with.
    Tape -> Maybe Text
vTLDevice :: Prelude.Maybe Prelude.Text,
    -- | If the tape is archived as write-once-read-many (WORM), this value is
    -- @true@.
    Tape -> Maybe Bool
worm :: Prelude.Maybe Prelude.Bool
  }
  deriving (Tape -> Tape -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Tape -> Tape -> Bool
$c/= :: Tape -> Tape -> Bool
== :: Tape -> Tape -> Bool
$c== :: Tape -> Tape -> Bool
Prelude.Eq, ReadPrec [Tape]
ReadPrec Tape
Int -> ReadS Tape
ReadS [Tape]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Tape]
$creadListPrec :: ReadPrec [Tape]
readPrec :: ReadPrec Tape
$creadPrec :: ReadPrec Tape
readList :: ReadS [Tape]
$creadList :: ReadS [Tape]
readsPrec :: Int -> ReadS Tape
$creadsPrec :: Int -> ReadS Tape
Prelude.Read, Int -> Tape -> ShowS
[Tape] -> ShowS
Tape -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Tape] -> ShowS
$cshowList :: [Tape] -> ShowS
show :: Tape -> String
$cshow :: Tape -> String
showsPrec :: Int -> Tape -> ShowS
$cshowsPrec :: Int -> Tape -> ShowS
Prelude.Show, forall x. Rep Tape x -> Tape
forall x. Tape -> Rep Tape x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Tape x -> Tape
$cfrom :: forall x. Tape -> Rep Tape x
Prelude.Generic)

-- |
-- Create a value of 'Tape' 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:
--
-- 'kmsKey', 'tape_kmsKey' - Undocumented member.
--
-- 'poolEntryDate', 'tape_poolEntryDate' - The date that the tape enters a custom tape pool.
--
-- 'poolId', 'tape_poolId' - The ID of the pool that contains tapes that will be archived. The tapes
-- in this pool are archived in the S3 storage class that is associated
-- with the pool. When you use your backup application to eject the tape,
-- the tape is archived directly into the storage class (S3 Glacier or S3
-- Glacier Deep Archive) that corresponds to the pool.
--
-- 'progress', 'tape_progress' - For archiving virtual tapes, indicates how much data remains to be
-- uploaded before archiving is complete.
--
-- Range: 0 (not started) to 100 (complete).
--
-- 'retentionStartDate', 'tape_retentionStartDate' - The date that the tape is first archived with tape retention lock
-- enabled.
--
-- 'tapeARN', 'tape_tapeARN' - The Amazon Resource Name (ARN) of the virtual tape.
--
-- 'tapeBarcode', 'tape_tapeBarcode' - The barcode that identifies a specific virtual tape.
--
-- 'tapeCreatedDate', 'tape_tapeCreatedDate' - The date the virtual tape was created.
--
-- 'tapeSizeInBytes', 'tape_tapeSizeInBytes' - The size, in bytes, of the virtual tape capacity.
--
-- 'tapeStatus', 'tape_tapeStatus' - The current state of the virtual tape.
--
-- 'tapeUsedInBytes', 'tape_tapeUsedInBytes' - The size, in bytes, of data stored on the virtual tape.
--
-- This value is not available for tapes created prior to May 13, 2015.
--
-- 'vTLDevice', 'tape_vTLDevice' - The virtual tape library (VTL) device that the virtual tape is
-- associated with.
--
-- 'worm', 'tape_worm' - If the tape is archived as write-once-read-many (WORM), this value is
-- @true@.
newTape ::
  Tape
newTape :: Tape
newTape =
  Tape'
    { $sel:kmsKey:Tape' :: Maybe Text
kmsKey = forall a. Maybe a
Prelude.Nothing,
      $sel:poolEntryDate:Tape' :: Maybe POSIX
poolEntryDate = forall a. Maybe a
Prelude.Nothing,
      $sel:poolId:Tape' :: Maybe Text
poolId = forall a. Maybe a
Prelude.Nothing,
      $sel:progress:Tape' :: Maybe Double
progress = forall a. Maybe a
Prelude.Nothing,
      $sel:retentionStartDate:Tape' :: Maybe POSIX
retentionStartDate = forall a. Maybe a
Prelude.Nothing,
      $sel:tapeARN:Tape' :: Maybe Text
tapeARN = forall a. Maybe a
Prelude.Nothing,
      $sel:tapeBarcode:Tape' :: Maybe Text
tapeBarcode = forall a. Maybe a
Prelude.Nothing,
      $sel:tapeCreatedDate:Tape' :: Maybe POSIX
tapeCreatedDate = forall a. Maybe a
Prelude.Nothing,
      $sel:tapeSizeInBytes:Tape' :: Maybe Integer
tapeSizeInBytes = forall a. Maybe a
Prelude.Nothing,
      $sel:tapeStatus:Tape' :: Maybe Text
tapeStatus = forall a. Maybe a
Prelude.Nothing,
      $sel:tapeUsedInBytes:Tape' :: Maybe Integer
tapeUsedInBytes = forall a. Maybe a
Prelude.Nothing,
      $sel:vTLDevice:Tape' :: Maybe Text
vTLDevice = forall a. Maybe a
Prelude.Nothing,
      $sel:worm:Tape' :: Maybe Bool
worm = forall a. Maybe a
Prelude.Nothing
    }

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

-- | The date that the tape enters a custom tape pool.
tape_poolEntryDate :: Lens.Lens' Tape (Prelude.Maybe Prelude.UTCTime)
tape_poolEntryDate :: Lens' Tape (Maybe UTCTime)
tape_poolEntryDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe POSIX
poolEntryDate :: Maybe POSIX
$sel:poolEntryDate:Tape' :: Tape -> Maybe POSIX
poolEntryDate} -> Maybe POSIX
poolEntryDate) (\s :: Tape
s@Tape' {} Maybe POSIX
a -> Tape
s {$sel:poolEntryDate:Tape' :: Maybe POSIX
poolEntryDate = Maybe POSIX
a} :: Tape) 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 ID of the pool that contains tapes that will be archived. The tapes
-- in this pool are archived in the S3 storage class that is associated
-- with the pool. When you use your backup application to eject the tape,
-- the tape is archived directly into the storage class (S3 Glacier or S3
-- Glacier Deep Archive) that corresponds to the pool.
tape_poolId :: Lens.Lens' Tape (Prelude.Maybe Prelude.Text)
tape_poolId :: Lens' Tape (Maybe Text)
tape_poolId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Text
poolId :: Maybe Text
$sel:poolId:Tape' :: Tape -> Maybe Text
poolId} -> Maybe Text
poolId) (\s :: Tape
s@Tape' {} Maybe Text
a -> Tape
s {$sel:poolId:Tape' :: Maybe Text
poolId = Maybe Text
a} :: Tape)

-- | For archiving virtual tapes, indicates how much data remains to be
-- uploaded before archiving is complete.
--
-- Range: 0 (not started) to 100 (complete).
tape_progress :: Lens.Lens' Tape (Prelude.Maybe Prelude.Double)
tape_progress :: Lens' Tape (Maybe Double)
tape_progress = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Double
progress :: Maybe Double
$sel:progress:Tape' :: Tape -> Maybe Double
progress} -> Maybe Double
progress) (\s :: Tape
s@Tape' {} Maybe Double
a -> Tape
s {$sel:progress:Tape' :: Maybe Double
progress = Maybe Double
a} :: Tape)

-- | The date that the tape is first archived with tape retention lock
-- enabled.
tape_retentionStartDate :: Lens.Lens' Tape (Prelude.Maybe Prelude.UTCTime)
tape_retentionStartDate :: Lens' Tape (Maybe UTCTime)
tape_retentionStartDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe POSIX
retentionStartDate :: Maybe POSIX
$sel:retentionStartDate:Tape' :: Tape -> Maybe POSIX
retentionStartDate} -> Maybe POSIX
retentionStartDate) (\s :: Tape
s@Tape' {} Maybe POSIX
a -> Tape
s {$sel:retentionStartDate:Tape' :: Maybe POSIX
retentionStartDate = Maybe POSIX
a} :: Tape) 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 Amazon Resource Name (ARN) of the virtual tape.
tape_tapeARN :: Lens.Lens' Tape (Prelude.Maybe Prelude.Text)
tape_tapeARN :: Lens' Tape (Maybe Text)
tape_tapeARN = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Text
tapeARN :: Maybe Text
$sel:tapeARN:Tape' :: Tape -> Maybe Text
tapeARN} -> Maybe Text
tapeARN) (\s :: Tape
s@Tape' {} Maybe Text
a -> Tape
s {$sel:tapeARN:Tape' :: Maybe Text
tapeARN = Maybe Text
a} :: Tape)

-- | The barcode that identifies a specific virtual tape.
tape_tapeBarcode :: Lens.Lens' Tape (Prelude.Maybe Prelude.Text)
tape_tapeBarcode :: Lens' Tape (Maybe Text)
tape_tapeBarcode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Text
tapeBarcode :: Maybe Text
$sel:tapeBarcode:Tape' :: Tape -> Maybe Text
tapeBarcode} -> Maybe Text
tapeBarcode) (\s :: Tape
s@Tape' {} Maybe Text
a -> Tape
s {$sel:tapeBarcode:Tape' :: Maybe Text
tapeBarcode = Maybe Text
a} :: Tape)

-- | The date the virtual tape was created.
tape_tapeCreatedDate :: Lens.Lens' Tape (Prelude.Maybe Prelude.UTCTime)
tape_tapeCreatedDate :: Lens' Tape (Maybe UTCTime)
tape_tapeCreatedDate = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe POSIX
tapeCreatedDate :: Maybe POSIX
$sel:tapeCreatedDate:Tape' :: Tape -> Maybe POSIX
tapeCreatedDate} -> Maybe POSIX
tapeCreatedDate) (\s :: Tape
s@Tape' {} Maybe POSIX
a -> Tape
s {$sel:tapeCreatedDate:Tape' :: Maybe POSIX
tapeCreatedDate = Maybe POSIX
a} :: Tape) 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 size, in bytes, of the virtual tape capacity.
tape_tapeSizeInBytes :: Lens.Lens' Tape (Prelude.Maybe Prelude.Integer)
tape_tapeSizeInBytes :: Lens' Tape (Maybe Integer)
tape_tapeSizeInBytes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Integer
tapeSizeInBytes :: Maybe Integer
$sel:tapeSizeInBytes:Tape' :: Tape -> Maybe Integer
tapeSizeInBytes} -> Maybe Integer
tapeSizeInBytes) (\s :: Tape
s@Tape' {} Maybe Integer
a -> Tape
s {$sel:tapeSizeInBytes:Tape' :: Maybe Integer
tapeSizeInBytes = Maybe Integer
a} :: Tape)

-- | The current state of the virtual tape.
tape_tapeStatus :: Lens.Lens' Tape (Prelude.Maybe Prelude.Text)
tape_tapeStatus :: Lens' Tape (Maybe Text)
tape_tapeStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Text
tapeStatus :: Maybe Text
$sel:tapeStatus:Tape' :: Tape -> Maybe Text
tapeStatus} -> Maybe Text
tapeStatus) (\s :: Tape
s@Tape' {} Maybe Text
a -> Tape
s {$sel:tapeStatus:Tape' :: Maybe Text
tapeStatus = Maybe Text
a} :: Tape)

-- | The size, in bytes, of data stored on the virtual tape.
--
-- This value is not available for tapes created prior to May 13, 2015.
tape_tapeUsedInBytes :: Lens.Lens' Tape (Prelude.Maybe Prelude.Integer)
tape_tapeUsedInBytes :: Lens' Tape (Maybe Integer)
tape_tapeUsedInBytes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Integer
tapeUsedInBytes :: Maybe Integer
$sel:tapeUsedInBytes:Tape' :: Tape -> Maybe Integer
tapeUsedInBytes} -> Maybe Integer
tapeUsedInBytes) (\s :: Tape
s@Tape' {} Maybe Integer
a -> Tape
s {$sel:tapeUsedInBytes:Tape' :: Maybe Integer
tapeUsedInBytes = Maybe Integer
a} :: Tape)

-- | The virtual tape library (VTL) device that the virtual tape is
-- associated with.
tape_vTLDevice :: Lens.Lens' Tape (Prelude.Maybe Prelude.Text)
tape_vTLDevice :: Lens' Tape (Maybe Text)
tape_vTLDevice = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Text
vTLDevice :: Maybe Text
$sel:vTLDevice:Tape' :: Tape -> Maybe Text
vTLDevice} -> Maybe Text
vTLDevice) (\s :: Tape
s@Tape' {} Maybe Text
a -> Tape
s {$sel:vTLDevice:Tape' :: Maybe Text
vTLDevice = Maybe Text
a} :: Tape)

-- | If the tape is archived as write-once-read-many (WORM), this value is
-- @true@.
tape_worm :: Lens.Lens' Tape (Prelude.Maybe Prelude.Bool)
tape_worm :: Lens' Tape (Maybe Bool)
tape_worm = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\Tape' {Maybe Bool
worm :: Maybe Bool
$sel:worm:Tape' :: Tape -> Maybe Bool
worm} -> Maybe Bool
worm) (\s :: Tape
s@Tape' {} Maybe Bool
a -> Tape
s {$sel:worm:Tape' :: Maybe Bool
worm = Maybe Bool
a} :: Tape)

instance Data.FromJSON Tape where
  parseJSON :: Value -> Parser Tape
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"Tape"
      ( \Object
x ->
          Maybe Text
-> Maybe POSIX
-> Maybe Text
-> Maybe Double
-> Maybe POSIX
-> Maybe Text
-> Maybe Text
-> Maybe POSIX
-> Maybe Integer
-> Maybe Text
-> Maybe Integer
-> Maybe Text
-> Maybe Bool
-> Tape
Tape'
            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
"KMSKey")
            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
"PoolEntryDate")
            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
"PoolId")
            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
"Progress")
            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
"RetentionStartDate")
            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
"TapeARN")
            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
"TapeBarcode")
            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
"TapeCreatedDate")
            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
"TapeSizeInBytes")
            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
"TapeStatus")
            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
"TapeUsedInBytes")
            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
"VTLDevice")
            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
"Worm")
      )

instance Prelude.Hashable Tape where
  hashWithSalt :: Int -> Tape -> Int
hashWithSalt Int
_salt Tape' {Maybe Bool
Maybe Double
Maybe Integer
Maybe Text
Maybe POSIX
worm :: Maybe Bool
vTLDevice :: Maybe Text
tapeUsedInBytes :: Maybe Integer
tapeStatus :: Maybe Text
tapeSizeInBytes :: Maybe Integer
tapeCreatedDate :: Maybe POSIX
tapeBarcode :: Maybe Text
tapeARN :: Maybe Text
retentionStartDate :: Maybe POSIX
progress :: Maybe Double
poolId :: Maybe Text
poolEntryDate :: Maybe POSIX
kmsKey :: Maybe Text
$sel:worm:Tape' :: Tape -> Maybe Bool
$sel:vTLDevice:Tape' :: Tape -> Maybe Text
$sel:tapeUsedInBytes:Tape' :: Tape -> Maybe Integer
$sel:tapeStatus:Tape' :: Tape -> Maybe Text
$sel:tapeSizeInBytes:Tape' :: Tape -> Maybe Integer
$sel:tapeCreatedDate:Tape' :: Tape -> Maybe POSIX
$sel:tapeBarcode:Tape' :: Tape -> Maybe Text
$sel:tapeARN:Tape' :: Tape -> Maybe Text
$sel:retentionStartDate:Tape' :: Tape -> Maybe POSIX
$sel:progress:Tape' :: Tape -> Maybe Double
$sel:poolId:Tape' :: Tape -> Maybe Text
$sel:poolEntryDate:Tape' :: Tape -> Maybe POSIX
$sel:kmsKey:Tape' :: Tape -> Maybe Text
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
kmsKey
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
poolEntryDate
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
poolId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Double
progress
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
retentionStartDate
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tapeARN
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tapeBarcode
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
tapeCreatedDate
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
tapeSizeInBytes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
tapeStatus
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Integer
tapeUsedInBytes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
vTLDevice
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
worm

instance Prelude.NFData Tape where
  rnf :: Tape -> ()
rnf Tape' {Maybe Bool
Maybe Double
Maybe Integer
Maybe Text
Maybe POSIX
worm :: Maybe Bool
vTLDevice :: Maybe Text
tapeUsedInBytes :: Maybe Integer
tapeStatus :: Maybe Text
tapeSizeInBytes :: Maybe Integer
tapeCreatedDate :: Maybe POSIX
tapeBarcode :: Maybe Text
tapeARN :: Maybe Text
retentionStartDate :: Maybe POSIX
progress :: Maybe Double
poolId :: Maybe Text
poolEntryDate :: Maybe POSIX
kmsKey :: Maybe Text
$sel:worm:Tape' :: Tape -> Maybe Bool
$sel:vTLDevice:Tape' :: Tape -> Maybe Text
$sel:tapeUsedInBytes:Tape' :: Tape -> Maybe Integer
$sel:tapeStatus:Tape' :: Tape -> Maybe Text
$sel:tapeSizeInBytes:Tape' :: Tape -> Maybe Integer
$sel:tapeCreatedDate:Tape' :: Tape -> Maybe POSIX
$sel:tapeBarcode:Tape' :: Tape -> Maybe Text
$sel:tapeARN:Tape' :: Tape -> Maybe Text
$sel:retentionStartDate:Tape' :: Tape -> Maybe POSIX
$sel:progress:Tape' :: Tape -> Maybe Double
$sel:poolId:Tape' :: Tape -> Maybe Text
$sel:poolEntryDate:Tape' :: Tape -> Maybe POSIX
$sel:kmsKey:Tape' :: Tape -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
kmsKey
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
poolEntryDate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
poolId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Double
progress
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
retentionStartDate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tapeARN
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tapeBarcode
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
tapeCreatedDate
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
tapeSizeInBytes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
tapeStatus
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Integer
tapeUsedInBytes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
vTLDevice
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
worm