amazonka-glacier-1.6.1: Amazon Glacier SDK.

Copyright(c) 2013-2018 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay+amazonka@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.AWS.Glacier.Types

Contents

Description

 
Synopsis

Service Configuration

glacier :: Service Source #

API version 2012-06-01 of the Amazon Glacier SDK configuration.

Errors

_PolicyEnforcedException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if a retrieval job would exceed the current data policy's retrieval rate limit. For more information about data retrieval policies,

_InvalidParameterValueException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if a parameter of the request is incorrectly specified.

_RequestTimeoutException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if, when uploading an archive, Amazon Glacier times out while receiving the upload.

_ServiceUnavailableException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if the service cannot complete the request.

_InsufficientCapacityException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if there is insufficient capacity to process this expedited request. This error only applies to expedited retrievals and not to standard or bulk retrievals.

_ResourceNotFoundException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if the specified resource (such as a vault, upload ID, or job ID) doesn't exist.

_LimitExceededException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if the request results in a vault or account limit being exceeded.

_MissingParameterValueException :: AsError a => Getting (First ServiceError) a ServiceError Source #

Returned if a required header or parameter is missing from the request.

ActionCode

data ActionCode Source #

Instances
Bounded ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ActionCode -> c ActionCode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ActionCode #

toConstr :: ActionCode -> Constr #

dataTypeOf :: ActionCode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ActionCode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ActionCode) #

gmapT :: (forall b. Data b => b -> b) -> ActionCode -> ActionCode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ActionCode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ActionCode -> r #

gmapQ :: (forall d. Data d => d -> u) -> ActionCode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ActionCode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ActionCode -> m ActionCode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ActionCode -> m ActionCode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ActionCode -> m ActionCode #

Ord ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep ActionCode :: Type -> Type #

Hashable ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: ActionCode -> Text #

NFData ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: ActionCode -> () #

type Rep ActionCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep ActionCode = D1 (MetaData "ActionCode" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "ArchiveRetrieval" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "InventoryRetrieval" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Select" PrefixI False) (U1 :: Type -> Type)))

CannedACL

data CannedACL Source #

Instances
Bounded CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CannedACL -> c CannedACL #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CannedACL #

toConstr :: CannedACL -> Constr #

dataTypeOf :: CannedACL -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CannedACL) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CannedACL) #

gmapT :: (forall b. Data b => b -> b) -> CannedACL -> CannedACL #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CannedACL -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CannedACL -> r #

gmapQ :: (forall d. Data d => d -> u) -> CannedACL -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CannedACL -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CannedACL -> m CannedACL #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CannedACL -> m CannedACL #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CannedACL -> m CannedACL #

Ord CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep CannedACL :: Type -> Type #

Hashable CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toBS :: CannedACL -> ByteString #

FromText CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: CannedACL -> Text #

NFData CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: CannedACL -> () #

type Rep CannedACL Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep CannedACL = D1 (MetaData "CannedACL" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) ((C1 (MetaCons "AWSExecRead" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "AuthenticatedRead" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BucketOwnerFullControl" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "BucketOwnerRead" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Private" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PublicRead" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PublicReadWrite" PrefixI False) (U1 :: Type -> Type))))

EncryptionType

data EncryptionType Source #

Constructors

AES256 
AWSKMS 
Instances
Bounded EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EncryptionType -> c EncryptionType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EncryptionType #

toConstr :: EncryptionType -> Constr #

dataTypeOf :: EncryptionType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EncryptionType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EncryptionType) #

gmapT :: (forall b. Data b => b -> b) -> EncryptionType -> EncryptionType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EncryptionType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EncryptionType -> r #

gmapQ :: (forall d. Data d => d -> u) -> EncryptionType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EncryptionType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EncryptionType -> m EncryptionType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EncryptionType -> m EncryptionType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EncryptionType -> m EncryptionType #

Ord EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep EncryptionType :: Type -> Type #

Hashable EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

NFData EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: EncryptionType -> () #

type Rep EncryptionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep EncryptionType = D1 (MetaData "EncryptionType" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "AES256" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AWSKMS" PrefixI False) (U1 :: Type -> Type))

ExpressionType

data ExpressionType Source #

Constructors

Sql 
Instances
Bounded ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExpressionType -> c ExpressionType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExpressionType #

toConstr :: ExpressionType -> Constr #

dataTypeOf :: ExpressionType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExpressionType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExpressionType) #

gmapT :: (forall b. Data b => b -> b) -> ExpressionType -> ExpressionType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExpressionType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExpressionType -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExpressionType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExpressionType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExpressionType -> m ExpressionType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExpressionType -> m ExpressionType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExpressionType -> m ExpressionType #

Ord ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep ExpressionType :: Type -> Type #

Hashable ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

NFData ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: ExpressionType -> () #

type Rep ExpressionType Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep ExpressionType = D1 (MetaData "ExpressionType" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "Sql" PrefixI False) (U1 :: Type -> Type))

FileHeaderInfo

data FileHeaderInfo Source #

Constructors

Ignore 
None 
Use 
Instances
Bounded FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileHeaderInfo -> c FileHeaderInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileHeaderInfo #

toConstr :: FileHeaderInfo -> Constr #

dataTypeOf :: FileHeaderInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FileHeaderInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileHeaderInfo) #

gmapT :: (forall b. Data b => b -> b) -> FileHeaderInfo -> FileHeaderInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileHeaderInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileHeaderInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileHeaderInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileHeaderInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileHeaderInfo -> m FileHeaderInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileHeaderInfo -> m FileHeaderInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileHeaderInfo -> m FileHeaderInfo #

Ord FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep FileHeaderInfo :: Type -> Type #

Hashable FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

NFData FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: FileHeaderInfo -> () #

type Rep FileHeaderInfo Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep FileHeaderInfo = D1 (MetaData "FileHeaderInfo" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "Ignore" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "None" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Use" PrefixI False) (U1 :: Type -> Type)))

Permission

data Permission Source #

Instances
Bounded Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Permission -> c Permission #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Permission #

toConstr :: Permission -> Constr #

dataTypeOf :: Permission -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Permission) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Permission) #

gmapT :: (forall b. Data b => b -> b) -> Permission -> Permission #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Permission -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Permission -> r #

gmapQ :: (forall d. Data d => d -> u) -> Permission -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Permission -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Permission -> m Permission #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Permission -> m Permission #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Permission -> m Permission #

Ord Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep Permission :: Type -> Type #

Hashable Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: Permission -> Text #

NFData Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: Permission -> () #

type Rep Permission Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep Permission = D1 (MetaData "Permission" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) ((C1 (MetaCons "FullControl" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Read" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ReadAcp" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Write" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WriteAcp" PrefixI False) (U1 :: Type -> Type))))

QuoteFields

data QuoteFields Source #

Constructors

ASNeeded 
Always 
Instances
Bounded QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QuoteFields -> c QuoteFields #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QuoteFields #

toConstr :: QuoteFields -> Constr #

dataTypeOf :: QuoteFields -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QuoteFields) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QuoteFields) #

gmapT :: (forall b. Data b => b -> b) -> QuoteFields -> QuoteFields #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QuoteFields -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QuoteFields -> r #

gmapQ :: (forall d. Data d => d -> u) -> QuoteFields -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QuoteFields -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QuoteFields -> m QuoteFields #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QuoteFields -> m QuoteFields #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QuoteFields -> m QuoteFields #

Ord QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep QuoteFields :: Type -> Type #

Hashable QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: QuoteFields -> Text #

NFData QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: QuoteFields -> () #

type Rep QuoteFields Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep QuoteFields = D1 (MetaData "QuoteFields" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "ASNeeded" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Always" PrefixI False) (U1 :: Type -> Type))

StatusCode

data StatusCode Source #

Constructors

Failed 
InProgress 
Succeeded 
Instances
Bounded StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StatusCode -> c StatusCode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StatusCode #

toConstr :: StatusCode -> Constr #

dataTypeOf :: StatusCode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StatusCode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StatusCode) #

gmapT :: (forall b. Data b => b -> b) -> StatusCode -> StatusCode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StatusCode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StatusCode -> r #

gmapQ :: (forall d. Data d => d -> u) -> StatusCode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StatusCode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StatusCode -> m StatusCode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StatusCode -> m StatusCode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StatusCode -> m StatusCode #

Ord StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep StatusCode :: Type -> Type #

Hashable StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: StatusCode -> Text #

NFData StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: StatusCode -> () #

type Rep StatusCode Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep StatusCode = D1 (MetaData "StatusCode" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "Failed" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "InProgress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Succeeded" PrefixI False) (U1 :: Type -> Type)))

StorageClass

data StorageClass Source #

Instances
Bounded StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Eq StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Data StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StorageClass -> c StorageClass #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StorageClass #

toConstr :: StorageClass -> Constr #

dataTypeOf :: StorageClass -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StorageClass) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StorageClass) #

gmapT :: (forall b. Data b => b -> b) -> StorageClass -> StorageClass #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StorageClass -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StorageClass -> r #

gmapQ :: (forall d. Data d => d -> u) -> StorageClass -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StorageClass -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StorageClass -> m StorageClass #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StorageClass -> m StorageClass #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StorageClass -> m StorageClass #

Ord StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Read StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Generic StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep StorageClass :: Type -> Type #

Hashable StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToJSON StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToQuery StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToByteString StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromText StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToText StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: StorageClass -> Text #

NFData StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: StorageClass -> () #

type Rep StorageClass Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep StorageClass = D1 (MetaData "StorageClass" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "ReducedRedundancy" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Standard" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "StandardIA" PrefixI False) (U1 :: Type -> Type)))

Type

data Type Source #

Instances
Bounded Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Enum Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

succ :: Type -> Type #

pred :: Type -> Type #

toEnum :: Int -> Type #

fromEnum :: Type -> Int #

enumFrom :: Type -> [Type] #

enumFromThen :: Type -> Type -> [Type] #

enumFromTo :: Type -> Type -> [Type] #

enumFromThenTo :: Type -> Type -> Type -> [Type] #

Eq Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

(==) :: Type -> Type -> Bool #

(/=) :: Type -> Type -> Bool #

Data Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type #

toConstr :: Type -> Constr #

dataTypeOf :: Type -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type) #

gmapT :: (forall b. Data b => b -> b) -> Type -> Type #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r #

gmapQ :: (forall d. Data d => d -> u) -> Type -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type #

Ord Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

compare :: Type -> Type -> Ordering #

(<) :: Type -> Type -> Bool #

(<=) :: Type -> Type -> Bool #

(>) :: Type -> Type -> Bool #

(>=) :: Type -> Type -> Bool #

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Read Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Show Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Generic Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Hashable Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

hashWithSalt :: Int -> Type -> Int #

hash :: Type -> Int #

ToJSON Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

FromJSON Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

ToHeader Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toHeader :: HeaderName -> Type -> [Header] #

ToQuery Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toQuery :: Type -> QueryString #

ToByteString Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toBS :: Type -> ByteString #

FromText Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

parser :: Parser Type #

ToText Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

toText :: Type -> Text #

NFData Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

Methods

rnf :: Type -> () #

type Rep Type Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Sum

type Rep Type = D1 (MetaData "Type" "Network.AWS.Glacier.Types.Sum" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "AmazonCustomerByEmail" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CanonicalUser" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Group" PrefixI False) (U1 :: Type -> Type)))

ArchiveCreationOutput

data ArchiveCreationOutput Source #

Contains the Amazon Glacier response to your request.

For information about the underlying REST API, see Upload Archive . For conceptual information, see Working with Archives in Amazon Glacier .

See: archiveCreationOutput smart constructor.

Instances
Eq ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArchiveCreationOutput -> c ArchiveCreationOutput #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ArchiveCreationOutput #

toConstr :: ArchiveCreationOutput -> Constr #

dataTypeOf :: ArchiveCreationOutput -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ArchiveCreationOutput) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ArchiveCreationOutput) #

gmapT :: (forall b. Data b => b -> b) -> ArchiveCreationOutput -> ArchiveCreationOutput #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArchiveCreationOutput -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArchiveCreationOutput -> r #

gmapQ :: (forall d. Data d => d -> u) -> ArchiveCreationOutput -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ArchiveCreationOutput -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArchiveCreationOutput -> m ArchiveCreationOutput #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArchiveCreationOutput -> m ArchiveCreationOutput #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArchiveCreationOutput -> m ArchiveCreationOutput #

Read ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep ArchiveCreationOutput :: Type -> Type #

Hashable ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: ArchiveCreationOutput -> () #

type Rep ArchiveCreationOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep ArchiveCreationOutput = D1 (MetaData "ArchiveCreationOutput" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "ArchiveCreationOutput'" PrefixI True) (S1 (MetaSel (Just "_acoArchiveId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_acoChecksum") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acoLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

archiveCreationOutput :: ArchiveCreationOutput Source #

Creates a value of ArchiveCreationOutput with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • acoArchiveId - The ID of the archive. This value is also included as part of the location.
  • acoChecksum - The checksum of the archive computed by Amazon Glacier.
  • acoLocation - The relative URI path of the newly added archive resource.

acoArchiveId :: Lens' ArchiveCreationOutput (Maybe Text) Source #

The ID of the archive. This value is also included as part of the location.

acoChecksum :: Lens' ArchiveCreationOutput (Maybe Text) Source #

The checksum of the archive computed by Amazon Glacier.

acoLocation :: Lens' ArchiveCreationOutput (Maybe Text) Source #

The relative URI path of the newly added archive resource.

CSVInput

data CSVInput Source #

Contains information about the comma-separated value (CSV) file to select from.

See: csvInput smart constructor.

Instances
Eq CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CSVInput -> c CSVInput #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CSVInput #

toConstr :: CSVInput -> Constr #

dataTypeOf :: CSVInput -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CSVInput) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CSVInput) #

gmapT :: (forall b. Data b => b -> b) -> CSVInput -> CSVInput #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CSVInput -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CSVInput -> r #

gmapQ :: (forall d. Data d => d -> u) -> CSVInput -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CSVInput -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CSVInput -> m CSVInput #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CSVInput -> m CSVInput #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CSVInput -> m CSVInput #

Read CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep CSVInput :: Type -> Type #

Methods

from :: CSVInput -> Rep CSVInput x #

to :: Rep CSVInput x -> CSVInput #

Hashable CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

hashWithSalt :: Int -> CSVInput -> Int #

hash :: CSVInput -> Int #

ToJSON CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: CSVInput -> () #

type Rep CSVInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep CSVInput = D1 (MetaData "CSVInput" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "CSVInput'" PrefixI True) ((S1 (MetaSel (Just "_ciQuoteCharacter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ciRecordDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ciFileHeaderInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileHeaderInfo)))) :*: (S1 (MetaSel (Just "_ciQuoteEscapeCharacter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ciComments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ciFieldDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

csvInput :: CSVInput Source #

Creates a value of CSVInput with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ciQuoteCharacter - A value used as an escape character where the field delimiter is part of the value.
  • ciRecordDelimiter - A value used to separate individual records from each other.
  • ciFileHeaderInfo - Describes the first line of input. Valid values are None , Ignore , and Use .
  • ciQuoteEscapeCharacter - A single character used for escaping the quotation-mark character inside an already escaped value.
  • ciComments - A single character used to indicate that a row should be ignored when the character is present at the start of that row.
  • ciFieldDelimiter - A value used to separate individual fields from each other within a record.

ciQuoteCharacter :: Lens' CSVInput (Maybe Text) Source #

A value used as an escape character where the field delimiter is part of the value.

ciRecordDelimiter :: Lens' CSVInput (Maybe Text) Source #

A value used to separate individual records from each other.

ciFileHeaderInfo :: Lens' CSVInput (Maybe FileHeaderInfo) Source #

Describes the first line of input. Valid values are None , Ignore , and Use .

ciQuoteEscapeCharacter :: Lens' CSVInput (Maybe Text) Source #

A single character used for escaping the quotation-mark character inside an already escaped value.

ciComments :: Lens' CSVInput (Maybe Text) Source #

A single character used to indicate that a row should be ignored when the character is present at the start of that row.

ciFieldDelimiter :: Lens' CSVInput (Maybe Text) Source #

A value used to separate individual fields from each other within a record.

CSVOutput

data CSVOutput Source #

Contains information about the comma-separated value (CSV) file that the job results are stored in.

See: csvOutput smart constructor.

Instances
Eq CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CSVOutput -> c CSVOutput #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CSVOutput #

toConstr :: CSVOutput -> Constr #

dataTypeOf :: CSVOutput -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CSVOutput) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CSVOutput) #

gmapT :: (forall b. Data b => b -> b) -> CSVOutput -> CSVOutput #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CSVOutput -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CSVOutput -> r #

gmapQ :: (forall d. Data d => d -> u) -> CSVOutput -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CSVOutput -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CSVOutput -> m CSVOutput #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CSVOutput -> m CSVOutput #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CSVOutput -> m CSVOutput #

Read CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep CSVOutput :: Type -> Type #

Hashable CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: CSVOutput -> () #

type Rep CSVOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep CSVOutput = D1 (MetaData "CSVOutput" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "CSVOutput'" PrefixI True) ((S1 (MetaSel (Just "_coQuoteCharacter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_coQuoteFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe QuoteFields))) :*: (S1 (MetaSel (Just "_coRecordDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_coQuoteEscapeCharacter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_coFieldDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

csvOutput :: CSVOutput Source #

Creates a value of CSVOutput with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • coQuoteCharacter - A value used as an escape character where the field delimiter is part of the value.
  • coQuoteFields - A value that indicates whether all output fields should be contained within quotation marks.
  • coRecordDelimiter - A value used to separate individual records from each other.
  • coQuoteEscapeCharacter - A single character used for escaping the quotation-mark character inside an already escaped value.
  • coFieldDelimiter - A value used to separate individual fields from each other within a record.

coQuoteCharacter :: Lens' CSVOutput (Maybe Text) Source #

A value used as an escape character where the field delimiter is part of the value.

coQuoteFields :: Lens' CSVOutput (Maybe QuoteFields) Source #

A value that indicates whether all output fields should be contained within quotation marks.

coRecordDelimiter :: Lens' CSVOutput (Maybe Text) Source #

A value used to separate individual records from each other.

coQuoteEscapeCharacter :: Lens' CSVOutput (Maybe Text) Source #

A single character used for escaping the quotation-mark character inside an already escaped value.

coFieldDelimiter :: Lens' CSVOutput (Maybe Text) Source #

A value used to separate individual fields from each other within a record.

DataRetrievalPolicy

data DataRetrievalPolicy Source #

Data retrieval policy.

See: dataRetrievalPolicy smart constructor.

Instances
Eq DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataRetrievalPolicy -> c DataRetrievalPolicy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DataRetrievalPolicy #

toConstr :: DataRetrievalPolicy -> Constr #

dataTypeOf :: DataRetrievalPolicy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DataRetrievalPolicy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DataRetrievalPolicy) #

gmapT :: (forall b. Data b => b -> b) -> DataRetrievalPolicy -> DataRetrievalPolicy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataRetrievalPolicy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataRetrievalPolicy -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataRetrievalPolicy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataRetrievalPolicy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataRetrievalPolicy -> m DataRetrievalPolicy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataRetrievalPolicy -> m DataRetrievalPolicy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataRetrievalPolicy -> m DataRetrievalPolicy #

Read DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep DataRetrievalPolicy :: Type -> Type #

Hashable DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: DataRetrievalPolicy -> () #

type Rep DataRetrievalPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep DataRetrievalPolicy = D1 (MetaData "DataRetrievalPolicy" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" True) (C1 (MetaCons "DataRetrievalPolicy'" PrefixI True) (S1 (MetaSel (Just "_drpRules") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DataRetrievalRule]))))

dataRetrievalPolicy :: DataRetrievalPolicy Source #

Creates a value of DataRetrievalPolicy with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • drpRules - The policy rule. Although this is a list type, currently there must be only one rule, which contains a Strategy field and optionally a BytesPerHour field.

drpRules :: Lens' DataRetrievalPolicy [DataRetrievalRule] Source #

The policy rule. Although this is a list type, currently there must be only one rule, which contains a Strategy field and optionally a BytesPerHour field.

DataRetrievalRule

data DataRetrievalRule Source #

Data retrieval policy rule.

See: dataRetrievalRule smart constructor.

Instances
Eq DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataRetrievalRule -> c DataRetrievalRule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DataRetrievalRule #

toConstr :: DataRetrievalRule -> Constr #

dataTypeOf :: DataRetrievalRule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DataRetrievalRule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DataRetrievalRule) #

gmapT :: (forall b. Data b => b -> b) -> DataRetrievalRule -> DataRetrievalRule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataRetrievalRule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataRetrievalRule -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataRetrievalRule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataRetrievalRule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataRetrievalRule -> m DataRetrievalRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataRetrievalRule -> m DataRetrievalRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataRetrievalRule -> m DataRetrievalRule #

Read DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep DataRetrievalRule :: Type -> Type #

Hashable DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: DataRetrievalRule -> () #

type Rep DataRetrievalRule Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep DataRetrievalRule = D1 (MetaData "DataRetrievalRule" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "DataRetrievalRule'" PrefixI True) (S1 (MetaSel (Just "_drrStrategy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_drrBytesPerHour") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Integer))))

dataRetrievalRule :: DataRetrievalRule Source #

Creates a value of DataRetrievalRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • drrStrategy - The type of data retrieval policy to set. Valid values: BytesPerHour|FreeTier|None
  • drrBytesPerHour - The maximum number of bytes that can be retrieved in an hour. This field is required only if the value of the Strategy field is BytesPerHour . Your PUT operation will be rejected if the Strategy field is not set to BytesPerHour and you set this field.

drrStrategy :: Lens' DataRetrievalRule (Maybe Text) Source #

The type of data retrieval policy to set. Valid values: BytesPerHour|FreeTier|None

drrBytesPerHour :: Lens' DataRetrievalRule (Maybe Integer) Source #

The maximum number of bytes that can be retrieved in an hour. This field is required only if the value of the Strategy field is BytesPerHour . Your PUT operation will be rejected if the Strategy field is not set to BytesPerHour and you set this field.

DescribeVaultOutput

data DescribeVaultOutput Source #

Contains the Amazon Glacier response to your request.

See: describeVaultOutput smart constructor.

Instances
Eq DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DescribeVaultOutput -> c DescribeVaultOutput #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DescribeVaultOutput #

toConstr :: DescribeVaultOutput -> Constr #

dataTypeOf :: DescribeVaultOutput -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DescribeVaultOutput) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DescribeVaultOutput) #

gmapT :: (forall b. Data b => b -> b) -> DescribeVaultOutput -> DescribeVaultOutput #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DescribeVaultOutput -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DescribeVaultOutput -> r #

gmapQ :: (forall d. Data d => d -> u) -> DescribeVaultOutput -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DescribeVaultOutput -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DescribeVaultOutput -> m DescribeVaultOutput #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DescribeVaultOutput -> m DescribeVaultOutput #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DescribeVaultOutput -> m DescribeVaultOutput #

Read DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep DescribeVaultOutput :: Type -> Type #

Hashable DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: DescribeVaultOutput -> () #

type Rep DescribeVaultOutput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep DescribeVaultOutput = D1 (MetaData "DescribeVaultOutput" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "DescribeVaultOutput'" PrefixI True) ((S1 (MetaSel (Just "_dvoVaultName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dvoSizeInBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Integer)) :*: S1 (MetaSel (Just "_dvoLastInventoryDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_dvoVaultARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dvoCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dvoNumberOfArchives") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Integer))))))

describeVaultOutput :: DescribeVaultOutput Source #

Creates a value of DescribeVaultOutput with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • dvoVaultName - The name of the vault.
  • dvoSizeInBytes - Total size, in bytes, of the archives in the vault as of the last inventory date. This field will return null if an inventory has not yet run on the vault, for example if you just created the vault.
  • dvoLastInventoryDate - The Universal Coordinated Time (UTC) date when Amazon Glacier completed the last vault inventory. This value should be a string in the ISO 8601 date format, for example 2012-03-20T17:03:43.221Z .
  • dvoVaultARN - The Amazon Resource Name (ARN) of the vault.
  • dvoCreationDate - The Universal Coordinated Time (UTC) date when the vault was created. This value should be a string in the ISO 8601 date format, for example 2012-03-20T17:03:43.221Z .
  • dvoNumberOfArchives - The number of archives in the vault as of the last inventory date. This field will return null if an inventory has not yet run on the vault, for example if you just created the vault.

dvoSizeInBytes :: Lens' DescribeVaultOutput (Maybe Integer) Source #

Total size, in bytes, of the archives in the vault as of the last inventory date. This field will return null if an inventory has not yet run on the vault, for example if you just created the vault.

dvoLastInventoryDate :: Lens' DescribeVaultOutput (Maybe Text) Source #

The Universal Coordinated Time (UTC) date when Amazon Glacier completed the last vault inventory. This value should be a string in the ISO 8601 date format, for example 2012-03-20T17:03:43.221Z .

dvoVaultARN :: Lens' DescribeVaultOutput (Maybe Text) Source #

The Amazon Resource Name (ARN) of the vault.

dvoCreationDate :: Lens' DescribeVaultOutput (Maybe Text) Source #

The Universal Coordinated Time (UTC) date when the vault was created. This value should be a string in the ISO 8601 date format, for example 2012-03-20T17:03:43.221Z .

dvoNumberOfArchives :: Lens' DescribeVaultOutput (Maybe Integer) Source #

The number of archives in the vault as of the last inventory date. This field will return null if an inventory has not yet run on the vault, for example if you just created the vault.

Encryption

data Encryption Source #

Contains information about the encryption used to store the job results in Amazon S3.

See: encryption smart constructor.

Instances
Eq Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Encryption -> c Encryption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Encryption #

toConstr :: Encryption -> Constr #

dataTypeOf :: Encryption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Encryption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Encryption) #

gmapT :: (forall b. Data b => b -> b) -> Encryption -> Encryption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Encryption -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Encryption -> r #

gmapQ :: (forall d. Data d => d -> u) -> Encryption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Encryption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Encryption -> m Encryption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Encryption -> m Encryption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Encryption -> m Encryption #

Read Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep Encryption :: Type -> Type #

Hashable Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: Encryption -> () #

type Rep Encryption Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep Encryption = D1 (MetaData "Encryption" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "Encryption'" PrefixI True) (S1 (MetaSel (Just "_eEncryptionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EncryptionType)) :*: (S1 (MetaSel (Just "_eKMSKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eKMSContext") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

encryption :: Encryption Source #

Creates a value of Encryption with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • eEncryptionType - The server-side encryption algorithm used when storing job results in Amazon S3, for example AES256 or aws:kms .
  • eKMSKeyId - The AWS KMS key ID to use for object encryption. All GET and PUT requests for an object protected by AWS KMS fail if not made by using Secure Sockets Layer (SSL) or Signature Version 4.
  • eKMSContext - Optional. If the encryption type is aws:kms , you can use this value to specify the encryption context for the job results.

eEncryptionType :: Lens' Encryption (Maybe EncryptionType) Source #

The server-side encryption algorithm used when storing job results in Amazon S3, for example AES256 or aws:kms .

eKMSKeyId :: Lens' Encryption (Maybe Text) Source #

The AWS KMS key ID to use for object encryption. All GET and PUT requests for an object protected by AWS KMS fail if not made by using Secure Sockets Layer (SSL) or Signature Version 4.

eKMSContext :: Lens' Encryption (Maybe Text) Source #

Optional. If the encryption type is aws:kms , you can use this value to specify the encryption context for the job results.

GlacierJobDescription

data GlacierJobDescription Source #

Contains the description of an Amazon Glacier job.

See: glacierJobDescription smart constructor.

Instances
Eq GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GlacierJobDescription -> c GlacierJobDescription #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GlacierJobDescription #

toConstr :: GlacierJobDescription -> Constr #

dataTypeOf :: GlacierJobDescription -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GlacierJobDescription) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GlacierJobDescription) #

gmapT :: (forall b. Data b => b -> b) -> GlacierJobDescription -> GlacierJobDescription #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GlacierJobDescription -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GlacierJobDescription -> r #

gmapQ :: (forall d. Data d => d -> u) -> GlacierJobDescription -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GlacierJobDescription -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GlacierJobDescription -> m GlacierJobDescription #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GlacierJobDescription -> m GlacierJobDescription #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GlacierJobDescription -> m GlacierJobDescription #

Read GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep GlacierJobDescription :: Type -> Type #

Hashable GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: GlacierJobDescription -> () #

type Rep GlacierJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep GlacierJobDescription = D1 (MetaData "GlacierJobDescription" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "GlacierJobDescription'" PrefixI True) ((((S1 (MetaSel (Just "_gjdSHA256TreeHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gjdArchiveId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gjdSelectParameters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SelectParameters)) :*: (S1 (MetaSel (Just "_gjdJobId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gjdJobOutputPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_gjdRetrievalByteRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gjdInventoryRetrievalParameters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InventoryRetrievalJobDescription))) :*: (S1 (MetaSel (Just "_gjdAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ActionCode)) :*: (S1 (MetaSel (Just "_gjdJobDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gjdSNSTopic") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_gjdStatusMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gjdVaultARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gjdOutputLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OutputLocation)) :*: (S1 (MetaSel (Just "_gjdTier") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gjdArchiveSHA256TreeHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_gjdCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gjdCompleted") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gjdCompletionDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_gjdInventorySizeInBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Integer)) :*: (S1 (MetaSel (Just "_gjdArchiveSizeInBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Integer)) :*: S1 (MetaSel (Just "_gjdStatusCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StatusCode))))))))

glacierJobDescription :: GlacierJobDescription Source #

Creates a value of GlacierJobDescription with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gjdSHA256TreeHash - For an archive retrieval job, this value is the checksum of the archive. Otherwise, this value is null. The SHA256 tree hash value for the requested range of an archive. If the InitiateJob request for an archive specified a tree-hash aligned range, then this field returns a value. If the whole archive is retrieved, this value is the same as the ArchiveSHA256TreeHash value. This field is null for the following: * Archive retrieval jobs that specify a range that is not tree-hash aligned * Archival jobs that specify a range that is equal to the whole archive, when the job status is InProgress * Inventory jobs * Select jobs
  • gjdArchiveId - The archive ID requested for a select job or archive retrieval. Otherwise, this field is null.
  • gjdSelectParameters - Contains the parameters used for a select.
  • gjdJobId - An opaque string that identifies an Amazon Glacier job.
  • gjdJobOutputPath - Contains the job output location.
  • gjdRetrievalByteRange - The retrieved byte range for archive retrieval jobs in the form StartByteValue -EndByteValue . If no range was specified in the archive retrieval, then the whole archive is retrieved. In this case, StartByteValue equals 0 and EndByteValue equals the size of the archive minus 1. For inventory retrieval or select jobs, this field is null.
  • gjdInventoryRetrievalParameters - Parameters used for range inventory retrieval.
  • gjdAction - The job type. This value is either ArchiveRetrieval , InventoryRetrieval , or Select .
  • gjdJobDescription - The job description provided when initiating the job.
  • gjdSNSTopic - An Amazon SNS topic that receives notification.
  • gjdStatusMessage - A friendly message that describes the job status.
  • gjdVaultARN - The Amazon Resource Name (ARN) of the vault from which an archive retrieval was requested.
  • gjdOutputLocation - Contains the location where the data from the select job is stored.
  • gjdTier - The tier to use for a select or an archive retrieval. Valid values are Expedited , Standard , or Bulk . Standard is the default.
  • gjdArchiveSHA256TreeHash - The SHA256 tree hash of the entire archive for an archive retrieval. For inventory retrieval or select jobs, this field is null.
  • gjdCreationDate - The UTC date when the job was created. This value is a string representation of ISO 8601 date format, for example "2012-03-20T17:03:43.221Z" .
  • gjdCompleted - The job status. When a job is completed, you get the job's output using Get Job Output (GET output).
  • gjdCompletionDate - The UTC time that the job request completed. While the job is in progress, the value is null.
  • gjdInventorySizeInBytes - For an inventory retrieval job, this value is the size in bytes of the inventory requested for download. For an archive retrieval or select job, this value is null.
  • gjdArchiveSizeInBytes - For an archive retrieval job, this value is the size in bytes of the archive being requested for download. For an inventory retrieval or select job, this value is null.
  • gjdStatusCode - The status code can be InProgress , Succeeded , or Failed , and indicates the status of the job.

gjdSHA256TreeHash :: Lens' GlacierJobDescription (Maybe Text) Source #

For an archive retrieval job, this value is the checksum of the archive. Otherwise, this value is null. The SHA256 tree hash value for the requested range of an archive. If the InitiateJob request for an archive specified a tree-hash aligned range, then this field returns a value. If the whole archive is retrieved, this value is the same as the ArchiveSHA256TreeHash value. This field is null for the following: * Archive retrieval jobs that specify a range that is not tree-hash aligned * Archival jobs that specify a range that is equal to the whole archive, when the job status is InProgress * Inventory jobs * Select jobs

gjdArchiveId :: Lens' GlacierJobDescription (Maybe Text) Source #

The archive ID requested for a select job or archive retrieval. Otherwise, this field is null.

gjdSelectParameters :: Lens' GlacierJobDescription (Maybe SelectParameters) Source #

Contains the parameters used for a select.

gjdJobId :: Lens' GlacierJobDescription (Maybe Text) Source #

An opaque string that identifies an Amazon Glacier job.

gjdJobOutputPath :: Lens' GlacierJobDescription (Maybe Text) Source #

Contains the job output location.

gjdRetrievalByteRange :: Lens' GlacierJobDescription (Maybe Text) Source #

The retrieved byte range for archive retrieval jobs in the form StartByteValue -EndByteValue . If no range was specified in the archive retrieval, then the whole archive is retrieved. In this case, StartByteValue equals 0 and EndByteValue equals the size of the archive minus 1. For inventory retrieval or select jobs, this field is null.

gjdAction :: Lens' GlacierJobDescription (Maybe ActionCode) Source #

The job type. This value is either ArchiveRetrieval , InventoryRetrieval , or Select .

gjdJobDescription :: Lens' GlacierJobDescription (Maybe Text) Source #

The job description provided when initiating the job.

gjdSNSTopic :: Lens' GlacierJobDescription (Maybe Text) Source #

An Amazon SNS topic that receives notification.

gjdStatusMessage :: Lens' GlacierJobDescription (Maybe Text) Source #

A friendly message that describes the job status.

gjdVaultARN :: Lens' GlacierJobDescription (Maybe Text) Source #

The Amazon Resource Name (ARN) of the vault from which an archive retrieval was requested.

gjdOutputLocation :: Lens' GlacierJobDescription (Maybe OutputLocation) Source #

Contains the location where the data from the select job is stored.

gjdTier :: Lens' GlacierJobDescription (Maybe Text) Source #

The tier to use for a select or an archive retrieval. Valid values are Expedited , Standard , or Bulk . Standard is the default.

gjdArchiveSHA256TreeHash :: Lens' GlacierJobDescription (Maybe Text) Source #

The SHA256 tree hash of the entire archive for an archive retrieval. For inventory retrieval or select jobs, this field is null.

gjdCreationDate :: Lens' GlacierJobDescription (Maybe Text) Source #

The UTC date when the job was created. This value is a string representation of ISO 8601 date format, for example "2012-03-20T17:03:43.221Z" .

gjdCompleted :: Lens' GlacierJobDescription (Maybe Bool) Source #

The job status. When a job is completed, you get the job's output using Get Job Output (GET output).

gjdCompletionDate :: Lens' GlacierJobDescription (Maybe Text) Source #

The UTC time that the job request completed. While the job is in progress, the value is null.

gjdInventorySizeInBytes :: Lens' GlacierJobDescription (Maybe Integer) Source #

For an inventory retrieval job, this value is the size in bytes of the inventory requested for download. For an archive retrieval or select job, this value is null.

gjdArchiveSizeInBytes :: Lens' GlacierJobDescription (Maybe Integer) Source #

For an archive retrieval job, this value is the size in bytes of the archive being requested for download. For an inventory retrieval or select job, this value is null.

gjdStatusCode :: Lens' GlacierJobDescription (Maybe StatusCode) Source #

The status code can be InProgress , Succeeded , or Failed , and indicates the status of the job.

Grant

data Grant Source #

Contains information about a grant.

See: grant smart constructor.

Instances
Eq Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

(==) :: Grant -> Grant -> Bool #

(/=) :: Grant -> Grant -> Bool #

Data Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Grant -> c Grant #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Grant #

toConstr :: Grant -> Constr #

dataTypeOf :: Grant -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Grant) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Grant) #

gmapT :: (forall b. Data b => b -> b) -> Grant -> Grant #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Grant -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Grant -> r #

gmapQ :: (forall d. Data d => d -> u) -> Grant -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Grant -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Grant -> m Grant #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Grant -> m Grant #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Grant -> m Grant #

Read Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

showsPrec :: Int -> Grant -> ShowS #

show :: Grant -> String #

showList :: [Grant] -> ShowS #

Generic Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep Grant :: Type -> Type #

Methods

from :: Grant -> Rep Grant x #

to :: Rep Grant x -> Grant #

Hashable Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

hashWithSalt :: Int -> Grant -> Int #

hash :: Grant -> Int #

ToJSON Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: Grant -> () #

type Rep Grant Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep Grant = D1 (MetaData "Grant" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "Grant'" PrefixI True) (S1 (MetaSel (Just "_gPermission") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Permission)) :*: S1 (MetaSel (Just "_gGrantee") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Grantee))))

grant :: Grant Source #

Creates a value of Grant with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gPermission :: Lens' Grant (Maybe Permission) Source #

Specifies the permission given to the grantee.

Grantee

data Grantee Source #

Contains information about the grantee.

See: grantee smart constructor.

Instances
Eq Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

(==) :: Grantee -> Grantee -> Bool #

(/=) :: Grantee -> Grantee -> Bool #

Data Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Grantee -> c Grantee #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Grantee #

toConstr :: Grantee -> Constr #

dataTypeOf :: Grantee -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Grantee) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Grantee) #

gmapT :: (forall b. Data b => b -> b) -> Grantee -> Grantee #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Grantee -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Grantee -> r #

gmapQ :: (forall d. Data d => d -> u) -> Grantee -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Grantee -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Grantee -> m Grantee #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Grantee -> m Grantee #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Grantee -> m Grantee #

Read Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep Grantee :: Type -> Type #

Methods

from :: Grantee -> Rep Grantee x #

to :: Rep Grantee x -> Grantee #

Hashable Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

hashWithSalt :: Int -> Grantee -> Int #

hash :: Grantee -> Int #

ToJSON Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: Grantee -> () #

type Rep Grantee Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep Grantee = D1 (MetaData "Grantee" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "Grantee'" PrefixI True) ((S1 (MetaSel (Just "_gURI") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gEmailAddress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Type)))))

grantee Source #

Arguments

:: Type

gType

-> Grantee 

Creates a value of Grantee with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • gURI - URI of the grantee group.
  • gEmailAddress - Email address of the grantee.
  • gDisplayName - Screen name of the grantee.
  • gId - The canonical user ID of the grantee.
  • gType - Type of grantee

gURI :: Lens' Grantee (Maybe Text) Source #

URI of the grantee group.

gEmailAddress :: Lens' Grantee (Maybe Text) Source #

Email address of the grantee.

gDisplayName :: Lens' Grantee (Maybe Text) Source #

Screen name of the grantee.

gId :: Lens' Grantee (Maybe Text) Source #

The canonical user ID of the grantee.

gType :: Lens' Grantee Type Source #

Type of grantee

InputSerialization

data InputSerialization Source #

Describes how the archive is serialized.

See: inputSerialization smart constructor.

Instances
Eq InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InputSerialization -> c InputSerialization #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InputSerialization #

toConstr :: InputSerialization -> Constr #

dataTypeOf :: InputSerialization -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InputSerialization) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InputSerialization) #

gmapT :: (forall b. Data b => b -> b) -> InputSerialization -> InputSerialization #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InputSerialization -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InputSerialization -> r #

gmapQ :: (forall d. Data d => d -> u) -> InputSerialization -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InputSerialization -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InputSerialization -> m InputSerialization #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InputSerialization -> m InputSerialization #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InputSerialization -> m InputSerialization #

Read InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep InputSerialization :: Type -> Type #

Hashable InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: InputSerialization -> () #

type Rep InputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep InputSerialization = D1 (MetaData "InputSerialization" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" True) (C1 (MetaCons "InputSerialization'" PrefixI True) (S1 (MetaSel (Just "_isCsv") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe CSVInput))))

inputSerialization :: InputSerialization Source #

Creates a value of InputSerialization with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • isCsv - Describes the serialization of a CSV-encoded object.

isCsv :: Lens' InputSerialization (Maybe CSVInput) Source #

Describes the serialization of a CSV-encoded object.

InventoryRetrievalJobDescription

data InventoryRetrievalJobDescription Source #

Describes the options for a range inventory retrieval job.

See: inventoryRetrievalJobDescription smart constructor.

Instances
Eq InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InventoryRetrievalJobDescription -> c InventoryRetrievalJobDescription #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InventoryRetrievalJobDescription #

toConstr :: InventoryRetrievalJobDescription -> Constr #

dataTypeOf :: InventoryRetrievalJobDescription -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InventoryRetrievalJobDescription) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InventoryRetrievalJobDescription) #

gmapT :: (forall b. Data b => b -> b) -> InventoryRetrievalJobDescription -> InventoryRetrievalJobDescription #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InventoryRetrievalJobDescription -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InventoryRetrievalJobDescription -> r #

gmapQ :: (forall d. Data d => d -> u) -> InventoryRetrievalJobDescription -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InventoryRetrievalJobDescription -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InventoryRetrievalJobDescription -> m InventoryRetrievalJobDescription #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InventoryRetrievalJobDescription -> m InventoryRetrievalJobDescription #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InventoryRetrievalJobDescription -> m InventoryRetrievalJobDescription #

Read InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep InventoryRetrievalJobDescription :: Type -> Type #

Hashable InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep InventoryRetrievalJobDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep InventoryRetrievalJobDescription = D1 (MetaData "InventoryRetrievalJobDescription" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "InventoryRetrievalJobDescription'" PrefixI True) ((S1 (MetaSel (Just "_irjdFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_irjdEndDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_irjdStartDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_irjdMarker") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_irjdLimit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

inventoryRetrievalJobDescription :: InventoryRetrievalJobDescription Source #

Creates a value of InventoryRetrievalJobDescription with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • irjdFormat - The output format for the vault inventory list, which is set by the InitiateJob request when initiating a job to retrieve a vault inventory. Valid values are CSV and JSON .
  • irjdEndDate - The end of the date range in UTC for vault inventory retrieval that includes archives created before this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .
  • irjdStartDate - The start of the date range in Universal Coordinated Time (UTC) for vault inventory retrieval that includes archives created on or after this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .
  • irjdMarker - An opaque string that represents where to continue pagination of the vault inventory retrieval results. You use the marker in a new InitiateJob request to obtain additional inventory items. If there are no more inventory items, this value is null . For more information, see Range Inventory Retrieval .
  • irjdLimit - The maximum number of inventory items returned per vault inventory retrieval request. This limit is set when initiating the job with the a InitiateJob request.

irjdFormat :: Lens' InventoryRetrievalJobDescription (Maybe Text) Source #

The output format for the vault inventory list, which is set by the InitiateJob request when initiating a job to retrieve a vault inventory. Valid values are CSV and JSON .

irjdEndDate :: Lens' InventoryRetrievalJobDescription (Maybe Text) Source #

The end of the date range in UTC for vault inventory retrieval that includes archives created before this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .

irjdStartDate :: Lens' InventoryRetrievalJobDescription (Maybe Text) Source #

The start of the date range in Universal Coordinated Time (UTC) for vault inventory retrieval that includes archives created on or after this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .

irjdMarker :: Lens' InventoryRetrievalJobDescription (Maybe Text) Source #

An opaque string that represents where to continue pagination of the vault inventory retrieval results. You use the marker in a new InitiateJob request to obtain additional inventory items. If there are no more inventory items, this value is null . For more information, see Range Inventory Retrieval .

irjdLimit :: Lens' InventoryRetrievalJobDescription (Maybe Text) Source #

The maximum number of inventory items returned per vault inventory retrieval request. This limit is set when initiating the job with the a InitiateJob request.

InventoryRetrievalJobInput

data InventoryRetrievalJobInput Source #

Provides options for specifying a range inventory retrieval job.

See: inventoryRetrievalJobInput smart constructor.

Instances
Eq InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InventoryRetrievalJobInput -> c InventoryRetrievalJobInput #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InventoryRetrievalJobInput #

toConstr :: InventoryRetrievalJobInput -> Constr #

dataTypeOf :: InventoryRetrievalJobInput -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InventoryRetrievalJobInput) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InventoryRetrievalJobInput) #

gmapT :: (forall b. Data b => b -> b) -> InventoryRetrievalJobInput -> InventoryRetrievalJobInput #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InventoryRetrievalJobInput -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InventoryRetrievalJobInput -> r #

gmapQ :: (forall d. Data d => d -> u) -> InventoryRetrievalJobInput -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InventoryRetrievalJobInput -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InventoryRetrievalJobInput -> m InventoryRetrievalJobInput #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InventoryRetrievalJobInput -> m InventoryRetrievalJobInput #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InventoryRetrievalJobInput -> m InventoryRetrievalJobInput #

Read InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep InventoryRetrievalJobInput :: Type -> Type #

Hashable InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep InventoryRetrievalJobInput Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep InventoryRetrievalJobInput = D1 (MetaData "InventoryRetrievalJobInput" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "InventoryRetrievalJobInput'" PrefixI True) ((S1 (MetaSel (Just "_irjiEndDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_irjiStartDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_irjiMarker") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_irjiLimit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

inventoryRetrievalJobInput :: InventoryRetrievalJobInput Source #

Creates a value of InventoryRetrievalJobInput with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • irjiEndDate - The end of the date range in UTC for vault inventory retrieval that includes archives created before this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .
  • irjiStartDate - The start of the date range in UTC for vault inventory retrieval that includes archives created on or after this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .
  • irjiMarker - An opaque string that represents where to continue pagination of the vault inventory retrieval results. You use the marker in a new InitiateJob request to obtain additional inventory items. If there are no more inventory items, this value is null .
  • irjiLimit - Specifies the maximum number of inventory items returned per vault inventory retrieval request. Valid values are greater than or equal to 1.

irjiEndDate :: Lens' InventoryRetrievalJobInput (Maybe Text) Source #

The end of the date range in UTC for vault inventory retrieval that includes archives created before this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .

irjiStartDate :: Lens' InventoryRetrievalJobInput (Maybe Text) Source #

The start of the date range in UTC for vault inventory retrieval that includes archives created on or after this date. This value should be a string in the ISO 8601 date format, for example 2013-03-20T17:03:43Z .

irjiMarker :: Lens' InventoryRetrievalJobInput (Maybe Text) Source #

An opaque string that represents where to continue pagination of the vault inventory retrieval results. You use the marker in a new InitiateJob request to obtain additional inventory items. If there are no more inventory items, this value is null .

irjiLimit :: Lens' InventoryRetrievalJobInput (Maybe Text) Source #

Specifies the maximum number of inventory items returned per vault inventory retrieval request. Valid values are greater than or equal to 1.

JobParameters

data JobParameters Source #

Provides options for defining a job.

See: jobParameters smart constructor.

Instances
Eq JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> JobParameters -> c JobParameters #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c JobParameters #

toConstr :: JobParameters -> Constr #

dataTypeOf :: JobParameters -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c JobParameters) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c JobParameters) #

gmapT :: (forall b. Data b => b -> b) -> JobParameters -> JobParameters #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> JobParameters -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> JobParameters -> r #

gmapQ :: (forall d. Data d => d -> u) -> JobParameters -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> JobParameters -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> JobParameters -> m JobParameters #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> JobParameters -> m JobParameters #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> JobParameters -> m JobParameters #

Read JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep JobParameters :: Type -> Type #

Hashable JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: JobParameters -> () #

type Rep JobParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

jobParameters :: JobParameters Source #

Creates a value of JobParameters with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • jpArchiveId - The ID of the archive that you want to retrieve. This field is required only if Type is set to select or archive-retrieval code>. An error occurs if you specify this request parameter for an inventory retrieval job request.
  • jpSelectParameters - Contains the parameters that define a job.
  • jpFormat - When initiating a job to retrieve a vault inventory, you can optionally add this parameter to your request to specify the output format. If you are initiating an inventory job and do not specify a Format field, JSON is the default format. Valid values are CSV and JSON.
  • jpRetrievalByteRange - The byte range to retrieve for an archive retrieval. in the form "StartByteValue -EndByteValue " If not specified, the whole archive is retrieved. If specified, the byte range must be megabyte (1024*1024) aligned which means that StartByteValue must be divisible by 1 MB and EndByteValue plus 1 must be divisible by 1 MB or be the end of the archive specified as the archive byte size value minus 1. If RetrievalByteRange is not megabyte aligned, this operation returns a 400 response. An error occurs if you specify this field for an inventory retrieval job request.
  • jpInventoryRetrievalParameters - Input parameters used for range inventory retrieval.
  • jpSNSTopic - The Amazon SNS topic ARN to which Amazon Glacier sends a notification when the job is completed and the output is ready for you to download. The specified topic publishes the notification to its subscribers. The SNS topic must exist.
  • jpOutputLocation - Contains information about the location where the select job results are stored.
  • jpTier - The tier to use for a select or an archive retrieval job. Valid values are Expedited , Standard , or Bulk . Standard is the default.
  • jpType - The job type. You can initiate a job to perform a select query on an archive, retrieve an archive, or get an inventory of a vault. Valid values are "select", "archive-retrieval" and "inventory-retrieval".
  • jpDescription - The optional description for the job. The description must be less than or equal to 1,024 bytes. The allowable characters are 7-bit ASCII without control codes-specifically, ASCII values 32-126 decimal or 0x20-0x7E hexadecimal.

jpArchiveId :: Lens' JobParameters (Maybe Text) Source #

The ID of the archive that you want to retrieve. This field is required only if Type is set to select or archive-retrieval code>. An error occurs if you specify this request parameter for an inventory retrieval job request.

jpSelectParameters :: Lens' JobParameters (Maybe SelectParameters) Source #

Contains the parameters that define a job.

jpFormat :: Lens' JobParameters (Maybe Text) Source #

When initiating a job to retrieve a vault inventory, you can optionally add this parameter to your request to specify the output format. If you are initiating an inventory job and do not specify a Format field, JSON is the default format. Valid values are CSV and JSON.

jpRetrievalByteRange :: Lens' JobParameters (Maybe Text) Source #

The byte range to retrieve for an archive retrieval. in the form "StartByteValue -EndByteValue " If not specified, the whole archive is retrieved. If specified, the byte range must be megabyte (1024*1024) aligned which means that StartByteValue must be divisible by 1 MB and EndByteValue plus 1 must be divisible by 1 MB or be the end of the archive specified as the archive byte size value minus 1. If RetrievalByteRange is not megabyte aligned, this operation returns a 400 response. An error occurs if you specify this field for an inventory retrieval job request.

jpInventoryRetrievalParameters :: Lens' JobParameters (Maybe InventoryRetrievalJobInput) Source #

Input parameters used for range inventory retrieval.

jpSNSTopic :: Lens' JobParameters (Maybe Text) Source #

The Amazon SNS topic ARN to which Amazon Glacier sends a notification when the job is completed and the output is ready for you to download. The specified topic publishes the notification to its subscribers. The SNS topic must exist.

jpOutputLocation :: Lens' JobParameters (Maybe OutputLocation) Source #

Contains information about the location where the select job results are stored.

jpTier :: Lens' JobParameters (Maybe Text) Source #

The tier to use for a select or an archive retrieval job. Valid values are Expedited , Standard , or Bulk . Standard is the default.

jpType :: Lens' JobParameters (Maybe Text) Source #

The job type. You can initiate a job to perform a select query on an archive, retrieve an archive, or get an inventory of a vault. Valid values are "select", "archive-retrieval" and "inventory-retrieval".

jpDescription :: Lens' JobParameters (Maybe Text) Source #

The optional description for the job. The description must be less than or equal to 1,024 bytes. The allowable characters are 7-bit ASCII without control codes-specifically, ASCII values 32-126 decimal or 0x20-0x7E hexadecimal.

OutputLocation

data OutputLocation Source #

Contains information about the location where the select job results are stored.

See: outputLocation smart constructor.

Instances
Eq OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OutputLocation -> c OutputLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OutputLocation #

toConstr :: OutputLocation -> Constr #

dataTypeOf :: OutputLocation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OutputLocation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OutputLocation) #

gmapT :: (forall b. Data b => b -> b) -> OutputLocation -> OutputLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OutputLocation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OutputLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> OutputLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OutputLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OutputLocation -> m OutputLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OutputLocation -> m OutputLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OutputLocation -> m OutputLocation #

Read OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep OutputLocation :: Type -> Type #

Hashable OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: OutputLocation -> () #

type Rep OutputLocation Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep OutputLocation = D1 (MetaData "OutputLocation" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" True) (C1 (MetaCons "OutputLocation'" PrefixI True) (S1 (MetaSel (Just "_olS3") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe S3Location))))

outputLocation :: OutputLocation Source #

Creates a value of OutputLocation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • olS3 - Describes an S3 location that will receive the results of the job request.

olS3 :: Lens' OutputLocation (Maybe S3Location) Source #

Describes an S3 location that will receive the results of the job request.

OutputSerialization

data OutputSerialization Source #

Describes how the select output is serialized.

See: outputSerialization smart constructor.

Instances
Eq OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OutputSerialization -> c OutputSerialization #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OutputSerialization #

toConstr :: OutputSerialization -> Constr #

dataTypeOf :: OutputSerialization -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OutputSerialization) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OutputSerialization) #

gmapT :: (forall b. Data b => b -> b) -> OutputSerialization -> OutputSerialization #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OutputSerialization -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OutputSerialization -> r #

gmapQ :: (forall d. Data d => d -> u) -> OutputSerialization -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OutputSerialization -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OutputSerialization -> m OutputSerialization #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OutputSerialization -> m OutputSerialization #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OutputSerialization -> m OutputSerialization #

Read OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep OutputSerialization :: Type -> Type #

Hashable OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: OutputSerialization -> () #

type Rep OutputSerialization Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep OutputSerialization = D1 (MetaData "OutputSerialization" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" True) (C1 (MetaCons "OutputSerialization'" PrefixI True) (S1 (MetaSel (Just "_osCsv") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe CSVOutput))))

outputSerialization :: OutputSerialization Source #

Creates a value of OutputSerialization with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • osCsv - Describes the serialization of CSV-encoded query results.

osCsv :: Lens' OutputSerialization (Maybe CSVOutput) Source #

Describes the serialization of CSV-encoded query results.

PartListElement

data PartListElement Source #

A list of the part sizes of the multipart upload.

See: partListElement smart constructor.

Instances
Eq PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PartListElement -> c PartListElement #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PartListElement #

toConstr :: PartListElement -> Constr #

dataTypeOf :: PartListElement -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PartListElement) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PartListElement) #

gmapT :: (forall b. Data b => b -> b) -> PartListElement -> PartListElement #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PartListElement -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PartListElement -> r #

gmapQ :: (forall d. Data d => d -> u) -> PartListElement -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PartListElement -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PartListElement -> m PartListElement #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PartListElement -> m PartListElement #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PartListElement -> m PartListElement #

Read PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep PartListElement :: Type -> Type #

Hashable PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: PartListElement -> () #

type Rep PartListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep PartListElement = D1 (MetaData "PartListElement" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "PartListElement'" PrefixI True) (S1 (MetaSel (Just "_pleSHA256TreeHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pleRangeInBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

partListElement :: PartListElement Source #

Creates a value of PartListElement with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • pleSHA256TreeHash - The SHA256 tree hash value that Amazon Glacier calculated for the part. This field is never null .
  • pleRangeInBytes - The byte range of a part, inclusive of the upper value of the range.

pleSHA256TreeHash :: Lens' PartListElement (Maybe Text) Source #

The SHA256 tree hash value that Amazon Glacier calculated for the part. This field is never null .

pleRangeInBytes :: Lens' PartListElement (Maybe Text) Source #

The byte range of a part, inclusive of the upper value of the range.

ProvisionedCapacityDescription

data ProvisionedCapacityDescription Source #

The definition for a provisioned capacity unit.

See: provisionedCapacityDescription smart constructor.

Instances
Eq ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProvisionedCapacityDescription -> c ProvisionedCapacityDescription #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProvisionedCapacityDescription #

toConstr :: ProvisionedCapacityDescription -> Constr #

dataTypeOf :: ProvisionedCapacityDescription -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProvisionedCapacityDescription) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProvisionedCapacityDescription) #

gmapT :: (forall b. Data b => b -> b) -> ProvisionedCapacityDescription -> ProvisionedCapacityDescription #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProvisionedCapacityDescription -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProvisionedCapacityDescription -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProvisionedCapacityDescription -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProvisionedCapacityDescription -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProvisionedCapacityDescription -> m ProvisionedCapacityDescription #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProvisionedCapacityDescription -> m ProvisionedCapacityDescription #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProvisionedCapacityDescription -> m ProvisionedCapacityDescription #

Read ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep ProvisionedCapacityDescription :: Type -> Type #

Hashable ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep ProvisionedCapacityDescription Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep ProvisionedCapacityDescription = D1 (MetaData "ProvisionedCapacityDescription" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "ProvisionedCapacityDescription'" PrefixI True) (S1 (MetaSel (Just "_pcdCapacityId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_pcdStartDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pcdExpirationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

provisionedCapacityDescription :: ProvisionedCapacityDescription Source #

Creates a value of ProvisionedCapacityDescription with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • pcdCapacityId - The ID that identifies the provisioned capacity unit.
  • pcdStartDate - The date that the provisioned capacity unit was purchased, in Universal Coordinated Time (UTC).
  • pcdExpirationDate - The date that the provisioned capacity unit expires, in Universal Coordinated Time (UTC).

pcdCapacityId :: Lens' ProvisionedCapacityDescription (Maybe Text) Source #

The ID that identifies the provisioned capacity unit.

pcdStartDate :: Lens' ProvisionedCapacityDescription (Maybe Text) Source #

The date that the provisioned capacity unit was purchased, in Universal Coordinated Time (UTC).

pcdExpirationDate :: Lens' ProvisionedCapacityDescription (Maybe Text) Source #

The date that the provisioned capacity unit expires, in Universal Coordinated Time (UTC).

S3Location

data S3Location Source #

Contains information about the location in Amazon S3 where the select job results are stored.

See: s3Location smart constructor.

Instances
Eq S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> S3Location -> c S3Location #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c S3Location #

toConstr :: S3Location -> Constr #

dataTypeOf :: S3Location -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c S3Location) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c S3Location) #

gmapT :: (forall b. Data b => b -> b) -> S3Location -> S3Location #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> S3Location -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> S3Location -> r #

gmapQ :: (forall d. Data d => d -> u) -> S3Location -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> S3Location -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> S3Location -> m S3Location #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> S3Location -> m S3Location #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> S3Location -> m S3Location #

Read S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep S3Location :: Type -> Type #

Hashable S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: S3Location -> () #

type Rep S3Location Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

s3Location :: S3Location Source #

Creates a value of S3Location with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • slCannedACL - The canned access control list (ACL) to apply to the job results.
  • slPrefix - The prefix that is prepended to the results for this request.
  • slBucketName - The name of the Amazon S3 bucket where the job results are stored.
  • slAccessControlList - A list of grants that control access to the staged results.
  • slUserMetadata - A map of metadata to store with the job results in Amazon S3.
  • slEncryption - Contains information about the encryption used to store the job results in Amazon S3.
  • slStorageClass - The storage class used to store the job results.
  • slTagging - The tag-set that is applied to the job results.

slCannedACL :: Lens' S3Location (Maybe CannedACL) Source #

The canned access control list (ACL) to apply to the job results.

slPrefix :: Lens' S3Location (Maybe Text) Source #

The prefix that is prepended to the results for this request.

slBucketName :: Lens' S3Location (Maybe Text) Source #

The name of the Amazon S3 bucket where the job results are stored.

slAccessControlList :: Lens' S3Location [Grant] Source #

A list of grants that control access to the staged results.

slUserMetadata :: Lens' S3Location (HashMap Text Text) Source #

A map of metadata to store with the job results in Amazon S3.

slEncryption :: Lens' S3Location (Maybe Encryption) Source #

Contains information about the encryption used to store the job results in Amazon S3.

slStorageClass :: Lens' S3Location (Maybe StorageClass) Source #

The storage class used to store the job results.

slTagging :: Lens' S3Location (HashMap Text Text) Source #

The tag-set that is applied to the job results.

SelectParameters

data SelectParameters Source #

Contains information about the parameters used for a select.

See: selectParameters smart constructor.

Instances
Eq SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SelectParameters -> c SelectParameters #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SelectParameters #

toConstr :: SelectParameters -> Constr #

dataTypeOf :: SelectParameters -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SelectParameters) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SelectParameters) #

gmapT :: (forall b. Data b => b -> b) -> SelectParameters -> SelectParameters #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SelectParameters -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SelectParameters -> r #

gmapQ :: (forall d. Data d => d -> u) -> SelectParameters -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SelectParameters -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SelectParameters -> m SelectParameters #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SelectParameters -> m SelectParameters #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SelectParameters -> m SelectParameters #

Read SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep SelectParameters :: Type -> Type #

Hashable SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: SelectParameters -> () #

type Rep SelectParameters Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep SelectParameters = D1 (MetaData "SelectParameters" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "SelectParameters'" PrefixI True) ((S1 (MetaSel (Just "_spExpressionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ExpressionType)) :*: S1 (MetaSel (Just "_spOutputSerialization") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OutputSerialization))) :*: (S1 (MetaSel (Just "_spExpression") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_spInputSerialization") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InputSerialization)))))

selectParameters :: SelectParameters Source #

Creates a value of SelectParameters with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

spExpressionType :: Lens' SelectParameters (Maybe ExpressionType) Source #

The type of the provided expression, for example SQL .

spOutputSerialization :: Lens' SelectParameters (Maybe OutputSerialization) Source #

Describes how the results of the select job are serialized.

spExpression :: Lens' SelectParameters (Maybe Text) Source #

The expression that is used to select the object.

spInputSerialization :: Lens' SelectParameters (Maybe InputSerialization) Source #

Describes the serialization format of the object.

UploadListElement

data UploadListElement Source #

A list of in-progress multipart uploads for a vault.

See: uploadListElement smart constructor.

Instances
Eq UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UploadListElement -> c UploadListElement #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UploadListElement #

toConstr :: UploadListElement -> Constr #

dataTypeOf :: UploadListElement -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UploadListElement) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UploadListElement) #

gmapT :: (forall b. Data b => b -> b) -> UploadListElement -> UploadListElement #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UploadListElement -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UploadListElement -> r #

gmapQ :: (forall d. Data d => d -> u) -> UploadListElement -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UploadListElement -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UploadListElement -> m UploadListElement #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UploadListElement -> m UploadListElement #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UploadListElement -> m UploadListElement #

Read UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep UploadListElement :: Type -> Type #

Hashable UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: UploadListElement -> () #

type Rep UploadListElement Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep UploadListElement = D1 (MetaData "UploadListElement" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "UploadListElement'" PrefixI True) ((S1 (MetaSel (Just "_uleMultipartUploadId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ulePartSizeInBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Integer))) :*: (S1 (MetaSel (Just "_uleArchiveDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_uleVaultARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_uleCreationDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

uploadListElement :: UploadListElement Source #

Creates a value of UploadListElement with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • uleMultipartUploadId - The ID of a multipart upload.
  • ulePartSizeInBytes - The part size, in bytes, specified in the Initiate Multipart Upload request. This is the size of all the parts in the upload except the last part, which may be smaller than this size.
  • uleArchiveDescription - The description of the archive that was specified in the Initiate Multipart Upload request.
  • uleVaultARN - The Amazon Resource Name (ARN) of the vault that contains the archive.
  • uleCreationDate - The UTC time at which the multipart upload was initiated.

uleMultipartUploadId :: Lens' UploadListElement (Maybe Text) Source #

The ID of a multipart upload.

ulePartSizeInBytes :: Lens' UploadListElement (Maybe Integer) Source #

The part size, in bytes, specified in the Initiate Multipart Upload request. This is the size of all the parts in the upload except the last part, which may be smaller than this size.

uleArchiveDescription :: Lens' UploadListElement (Maybe Text) Source #

The description of the archive that was specified in the Initiate Multipart Upload request.

uleVaultARN :: Lens' UploadListElement (Maybe Text) Source #

The Amazon Resource Name (ARN) of the vault that contains the archive.

uleCreationDate :: Lens' UploadListElement (Maybe Text) Source #

The UTC time at which the multipart upload was initiated.

VaultAccessPolicy

data VaultAccessPolicy Source #

Contains the vault access policy.

See: vaultAccessPolicy smart constructor.

Instances
Eq VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VaultAccessPolicy -> c VaultAccessPolicy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VaultAccessPolicy #

toConstr :: VaultAccessPolicy -> Constr #

dataTypeOf :: VaultAccessPolicy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VaultAccessPolicy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VaultAccessPolicy) #

gmapT :: (forall b. Data b => b -> b) -> VaultAccessPolicy -> VaultAccessPolicy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VaultAccessPolicy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VaultAccessPolicy -> r #

gmapQ :: (forall d. Data d => d -> u) -> VaultAccessPolicy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VaultAccessPolicy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VaultAccessPolicy -> m VaultAccessPolicy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VaultAccessPolicy -> m VaultAccessPolicy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VaultAccessPolicy -> m VaultAccessPolicy #

Read VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep VaultAccessPolicy :: Type -> Type #

Hashable VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: VaultAccessPolicy -> () #

type Rep VaultAccessPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep VaultAccessPolicy = D1 (MetaData "VaultAccessPolicy" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" True) (C1 (MetaCons "VaultAccessPolicy'" PrefixI True) (S1 (MetaSel (Just "_vapPolicy") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

vaultAccessPolicy :: VaultAccessPolicy Source #

Creates a value of VaultAccessPolicy with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

vapPolicy :: Lens' VaultAccessPolicy (Maybe Text) Source #

The vault access policy.

VaultLockPolicy

data VaultLockPolicy Source #

Contains the vault lock policy.

See: vaultLockPolicy smart constructor.

Instances
Eq VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VaultLockPolicy -> c VaultLockPolicy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VaultLockPolicy #

toConstr :: VaultLockPolicy -> Constr #

dataTypeOf :: VaultLockPolicy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VaultLockPolicy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VaultLockPolicy) #

gmapT :: (forall b. Data b => b -> b) -> VaultLockPolicy -> VaultLockPolicy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VaultLockPolicy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VaultLockPolicy -> r #

gmapQ :: (forall d. Data d => d -> u) -> VaultLockPolicy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VaultLockPolicy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VaultLockPolicy -> m VaultLockPolicy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VaultLockPolicy -> m VaultLockPolicy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VaultLockPolicy -> m VaultLockPolicy #

Read VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep VaultLockPolicy :: Type -> Type #

Hashable VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: VaultLockPolicy -> () #

type Rep VaultLockPolicy Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep VaultLockPolicy = D1 (MetaData "VaultLockPolicy" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" True) (C1 (MetaCons "VaultLockPolicy'" PrefixI True) (S1 (MetaSel (Just "_vlpPolicy") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

vaultLockPolicy :: VaultLockPolicy Source #

Creates a value of VaultLockPolicy with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

vlpPolicy :: Lens' VaultLockPolicy (Maybe Text) Source #

The vault lock policy.

VaultNotificationConfig

data VaultNotificationConfig Source #

Represents a vault's notification configuration.

See: vaultNotificationConfig smart constructor.

Instances
Eq VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Data VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VaultNotificationConfig -> c VaultNotificationConfig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VaultNotificationConfig #

toConstr :: VaultNotificationConfig -> Constr #

dataTypeOf :: VaultNotificationConfig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VaultNotificationConfig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VaultNotificationConfig) #

gmapT :: (forall b. Data b => b -> b) -> VaultNotificationConfig -> VaultNotificationConfig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VaultNotificationConfig -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VaultNotificationConfig -> r #

gmapQ :: (forall d. Data d => d -> u) -> VaultNotificationConfig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VaultNotificationConfig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VaultNotificationConfig -> m VaultNotificationConfig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VaultNotificationConfig -> m VaultNotificationConfig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VaultNotificationConfig -> m VaultNotificationConfig #

Read VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Show VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Generic VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Associated Types

type Rep VaultNotificationConfig :: Type -> Type #

Hashable VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

ToJSON VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

FromJSON VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

NFData VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

Methods

rnf :: VaultNotificationConfig -> () #

type Rep VaultNotificationConfig Source # 
Instance details

Defined in Network.AWS.Glacier.Types.Product

type Rep VaultNotificationConfig = D1 (MetaData "VaultNotificationConfig" "Network.AWS.Glacier.Types.Product" "amazonka-glacier-1.6.1-1jk94OYE8nZKrGhzWrcb8m" False) (C1 (MetaCons "VaultNotificationConfig'" PrefixI True) (S1 (MetaSel (Just "_vncSNSTopic") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_vncEvents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))

vaultNotificationConfig :: VaultNotificationConfig Source #

Creates a value of VaultNotificationConfig with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • vncSNSTopic - The Amazon Simple Notification Service (Amazon SNS) topic Amazon Resource Name (ARN).
  • vncEvents - A list of one or more events for which Amazon Glacier will send a notification to the specified Amazon SNS topic.

vncSNSTopic :: Lens' VaultNotificationConfig (Maybe Text) Source #

The Amazon Simple Notification Service (Amazon SNS) topic Amazon Resource Name (ARN).

vncEvents :: Lens' VaultNotificationConfig [Text] Source #

A list of one or more events for which Amazon Glacier will send a notification to the specified Amazon SNS topic.