gogol-storage-transfer-0.4.0: Google Storage Transfer SDK.

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

Network.Google.StorageTransfer.Types

Contents

Description

 
Synopsis

Service Configuration

storageTransferService :: ServiceConfig Source #

Default request referring to version v1 of the Storage Transfer API. This contains the host and root path used as a starting point for constructing service requests.

OAuth Scopes

cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"] Source #

View and manage your data across Google Cloud Platform services

ErrorSummary

data ErrorSummary Source #

A summary of errors by error code, plus a count and sample error log entries.

See: errorSummary smart constructor.

Instances
Eq ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: ErrorSummary -> Constr #

dataTypeOf :: ErrorSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep ErrorSummary :: Type -> Type #

ToJSON ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ErrorSummary Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ErrorSummary = D1 (MetaData "ErrorSummary" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "ErrorSummary'" PrefixI True) (S1 (MetaSel (Just "_esErrorCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_esErrorCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ErrorSummaryErrorCode)) :*: S1 (MetaSel (Just "_esErrorLogEntries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ErrorLogEntry])))))

errorSummary :: ErrorSummary Source #

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

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

esErrorCount :: Lens' ErrorSummary (Maybe Int64) Source #

Count of this type of error. Required.

Status

data Status Source #

The `Status` type defines a logical error model that is suitable for different programming environments, including REST APIs and RPC APIs. It is used by gRPC. The error model is designed to be: - Simple to use and understand for most users - Flexible enough to meet unexpected needs # Overview The `Status` message contains three pieces of data: error code, error message, and error details. The error code should be an enum value of google.rpc.Code, but it may accept additional error codes if needed. The error message should be a developer-facing English message that helps developers *understand* and *resolve* the error. If a localized user-facing error message is needed, put the localized message in the error details or localize it in the client. The optional error details may contain arbitrary information about the error. There is a predefined set of error detail types in the package `google.rpc` that can be used for common error conditions. # Language mapping The `Status` message is the logical representation of the error model, but it is not necessarily the actual wire format. When the `Status` message is exposed in different client libraries and different wire protocols, it can be mapped differently. For example, it will likely be mapped to some exceptions in Java, but more likely mapped to some error codes in C. # Other uses The error model and the `Status` message can be used in a variety of environments, either with or without APIs, to provide a consistent developer experience across different environments. Example uses of this error model include: - Partial errors. If a service needs to return partial errors to the client, it may embed the `Status` in the normal response to indicate the partial errors. - Workflow errors. A typical workflow has multiple steps. Each step may have a `Status` message for error reporting. - Batch operations. If a client uses batch request and batch response, the `Status` message should be used directly inside batch response, one for each error sub-response. - Asynchronous operations. If an API call embeds asynchronous operation results in its response, the status of those operations should be represented directly using the `Status` message. - Logging. If some API errors are stored in logs, the message `Status` could be used directly after any stripping needed for security/privacy reasons.

See: status smart constructor.

Instances
Eq Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

Data Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep Status :: Type -> Type #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "Status'" PrefixI True) (S1 (MetaSel (Just "_sDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StatusDetailsItem])) :*: (S1 (MetaSel (Just "_sCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_sMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

status :: Status Source #

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

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

sDetails :: Lens' Status [StatusDetailsItem] Source #

A list of messages that carry the error details. There is a common set of message types for APIs to use.

sCode :: Lens' Status (Maybe Int32) Source #

The status code, which should be an enum value of google.rpc.Code.

sMessage :: Lens' Status (Maybe Text) Source #

A developer-facing error message, which should be in English. Any user-facing error message should be localized and sent in the google.rpc.Status.details field, or localized by the client.

ListOperationsResponse

data ListOperationsResponse Source #

The response message for Operations.ListOperations.

See: listOperationsResponse smart constructor.

Instances
Eq ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: ListOperationsResponse -> Constr #

dataTypeOf :: ListOperationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep ListOperationsResponse :: Type -> Type #

ToJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ListOperationsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ListOperationsResponse = D1 (MetaData "ListOperationsResponse" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "ListOperationsResponse'" PrefixI True) (S1 (MetaSel (Just "_lorNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lorOperations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Operation]))))

listOperationsResponse :: ListOperationsResponse Source #

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

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

lorNextPageToken :: Lens' ListOperationsResponse (Maybe Text) Source #

The standard List next-page token.

lorOperations :: Lens' ListOperationsResponse [Operation] Source #

A list of operations that matches the specified filter in the request.

TransferOperationStatus

data TransferOperationStatus Source #

Status of the transfer operation.

Constructors

StatusUnspecified

STATUS_UNSPECIFIED Zero is an illegal value.

InProgress

IN_PROGRESS In progress.

Paused

PAUSED Paused.

Success

SUCCESS Completed successfully.

Failed

FAILED Terminated due to an unrecoverable failure.

Aborted

ABORTED Aborted by the user.

Instances
Enum TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Eq TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Data TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

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

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

toConstr :: TransferOperationStatus -> Constr #

dataTypeOf :: TransferOperationStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Read TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Show TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Generic TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Associated Types

type Rep TransferOperationStatus :: Type -> Type #

Hashable TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToJSON TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromJSON TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromHttpApiData TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToHttpApiData TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep TransferOperationStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep TransferOperationStatus = D1 (MetaData "TransferOperationStatus" "Network.Google.StorageTransfer.Types.Sum" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) ((C1 (MetaCons "StatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "InProgress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Paused" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "Success" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Failed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Aborted" PrefixI False) (U1 :: Type -> Type))))

Schedule

data Schedule Source #

Transfers can be scheduled to recur or to run just once.

See: schedule smart constructor.

Instances
Eq Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: Schedule -> Constr #

dataTypeOf :: Schedule -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep Schedule :: Type -> Type #

Methods

from :: Schedule -> Rep Schedule x #

to :: Rep Schedule x -> Schedule #

ToJSON Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Schedule Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Schedule = D1 (MetaData "Schedule" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "Schedule'" PrefixI True) (S1 (MetaSel (Just "_sScheduleEndDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Date)) :*: (S1 (MetaSel (Just "_sScheduleStartDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Date)) :*: S1 (MetaSel (Just "_sStartTimeOfDay") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TimeOfDay')))))

schedule :: Schedule Source #

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

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

sScheduleEndDate :: Lens' Schedule (Maybe Date) Source #

The last day the recurring transfer will be run. If `scheduleEndDate` is the same as `scheduleStartDate`, the transfer will be executed only once.

sScheduleStartDate :: Lens' Schedule (Maybe Date) Source #

The first day the recurring transfer is scheduled to run. If `scheduleStartDate` is in the past, the transfer will run for the first time on the following day. Required.

sStartTimeOfDay :: Lens' Schedule (Maybe TimeOfDay') Source #

The time in UTC at which the transfer will be scheduled to start in a day. Transfers may start later than this time. If not specified, recurring and one-time transfers that are scheduled to run today will run immediately; recurring transfers that are scheduled to run on a future date will start at approximately midnight UTC on that date. Note that when configuring a transfer with the Cloud Platform Console, the transfer's start time in a day is specified in your local timezone.

ObjectConditions

data ObjectConditions Source #

Conditions that determine which objects will be transferred.

See: objectConditions smart constructor.

Instances
Eq ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: ObjectConditions -> Constr #

dataTypeOf :: ObjectConditions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep ObjectConditions :: Type -> Type #

ToJSON ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ObjectConditions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ObjectConditions = D1 (MetaData "ObjectConditions" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "ObjectConditions'" PrefixI True) ((S1 (MetaSel (Just "_ocMinTimeElapsedSinceLastModification") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_ocIncludePrefixes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_ocMaxTimeElapsedSinceLastModification") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_ocExcludePrefixes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

objectConditions :: ObjectConditions Source #

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

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

ocMinTimeElapsedSinceLastModification :: Lens' ObjectConditions (Maybe Scientific) Source #

If unspecified, `minTimeElapsedSinceLastModification` takes a zero value and `maxTimeElapsedSinceLastModification` takes the maximum possible value of Duration. Objects that satisfy the object conditions must either have a `lastModificationTime` greater or equal to `NOW` - `maxTimeElapsedSinceLastModification` and less than `NOW` - `minTimeElapsedSinceLastModification`, or not have a `lastModificationTime`.

ocIncludePrefixes :: Lens' ObjectConditions [Text] Source #

If `includePrefixes` is specified, objects that satisfy the object conditions must have names that start with one of the `includePrefixes` and that do not start with any of the `excludePrefixes`. If `includePrefixes` is not specified, all objects except those that have names starting with one of the `excludePrefixes` must satisfy the object conditions. Requirements: * Each include-prefix and exclude-prefix can contain any sequence of Unicode characters, of max length 1024 bytes when UTF8-encoded, and must not contain Carriage Return or Line Feed characters. Wildcard matching and regular expression matching are not supported. * Each include-prefix and exclude-prefix must omit the leading slash. For example, to include the `requests.gz` object in a transfer from `s3://my-aws-bucket/logs/y=2015/requests.gz`, specify the include prefix as `logs/y=2015/requests.gz`. * None of the include-prefix or the exclude-prefix values can be empty, if specified. * Each include-prefix must include a distinct portion of the object namespace, i.e., no include-prefix may be a prefix of another include-prefix. * Each exclude-prefix must exclude a distinct portion of the object namespace, i.e., no exclude-prefix may be a prefix of another exclude-prefix. * If `includePrefixes` is specified, then each exclude-prefix must start with the value of a path explicitly included by `includePrefixes`. The max size of `includePrefixes` is 1000.

ocMaxTimeElapsedSinceLastModification :: Lens' ObjectConditions (Maybe Scientific) Source #

`maxTimeElapsedSinceLastModification` is the complement to `minTimeElapsedSinceLastModification`.

ocExcludePrefixes :: Lens' ObjectConditions [Text] Source #

`excludePrefixes` must follow the requirements described for `includePrefixes`. The max size of `excludePrefixes` is 1000.

Operation

data Operation Source #

This resource represents a long-running operation that is the result of a network API call.

See: operation smart constructor.

Instances
Eq Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: Operation -> Constr #

dataTypeOf :: Operation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Operation = D1 (MetaData "Operation" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "Operation'" PrefixI True) ((S1 (MetaSel (Just "_oDone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_oError") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Status))) :*: (S1 (MetaSel (Just "_oResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationResponse)) :*: (S1 (MetaSel (Just "_oName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationMetadata))))))

operation :: Operation Source #

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

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

oDone :: Lens' Operation (Maybe Bool) Source #

If the value is `false`, it means the operation is still in progress. If `true`, the operation is completed, and either `error` or `response` is available.

oError :: Lens' Operation (Maybe Status) Source #

The error result of the operation in case of failure or cancellation.

oResponse :: Lens' Operation (Maybe OperationResponse) Source #

The normal response of the operation in case of success. If the original method returns no data on success, such as `Delete`, the response is `google.protobuf.Empty`. If the original method is standard `Get`/`Create`/`Update`, the response should be the resource. For other methods, the response should have the type `XxxResponse`, where `Xxx` is the original method name. For example, if the original method name is `TakeSnapshot()`, the inferred response type is `TakeSnapshotResponse`.

oName :: Lens' Operation (Maybe Text) Source #

The server-assigned name, which is only unique within the same service that originally returns it. If you use the default HTTP mapping, the `name` should have the format of `transferOperations/some/unique/name`.

oMetadata :: Lens' Operation (Maybe OperationMetadata) Source #

Represents the transfer operation object.

Empty

data Empty Source #

A generic empty message that you can re-use to avoid defining duplicated empty messages in your APIs. A typical example is to use it as the request or the response type of an API method. For instance: service Foo { rpc Bar(google.protobuf.Empty) returns (google.protobuf.Empty); } The JSON representation for `Empty` is empty JSON object `{}`.

See: empty smart constructor.

Instances
Eq Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

Data Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: Empty -> Constr #

dataTypeOf :: Empty -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep Empty :: Type -> Type #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "Empty'" PrefixI False) (U1 :: Type -> Type))

empty :: Empty Source #

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

PauseTransferOperationRequest

data PauseTransferOperationRequest Source #

Request passed to PauseTransferOperation.

See: pauseTransferOperationRequest smart constructor.

Instances
Eq PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: PauseTransferOperationRequest -> Constr #

dataTypeOf :: PauseTransferOperationRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep PauseTransferOperationRequest :: Type -> Type #

ToJSON PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep PauseTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep PauseTransferOperationRequest = D1 (MetaData "PauseTransferOperationRequest" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "PauseTransferOperationRequest'" PrefixI False) (U1 :: Type -> Type))

pauseTransferOperationRequest :: PauseTransferOperationRequest Source #

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

GoogleServiceAccount

data GoogleServiceAccount Source #

Google service account

See: googleServiceAccount smart constructor.

Instances
Eq GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: GoogleServiceAccount -> Constr #

dataTypeOf :: GoogleServiceAccount -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep GoogleServiceAccount :: Type -> Type #

ToJSON GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep GoogleServiceAccount Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep GoogleServiceAccount = D1 (MetaData "GoogleServiceAccount" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" True) (C1 (MetaCons "GoogleServiceAccount'" PrefixI True) (S1 (MetaSel (Just "_gsaAccountEmail") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

googleServiceAccount :: GoogleServiceAccount Source #

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

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

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: StatusDetailsItem -> Constr #

dataTypeOf :: StatusDetailsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" True) (C1 (MetaCons "StatusDetailsItem'" PrefixI True) (S1 (MetaSel (Just "_sdiAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

statusDetailsItem Source #

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

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

sdiAddtional :: Lens' StatusDetailsItem (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

Date

data Date Source #

Represents a whole or partial calendar date, e.g. a birthday. The time of day and time zone are either specified elsewhere or are not significant. The date is relative to the Proleptic Gregorian Calendar. This can represent: * A full date, with non-zero year, month and day values * A month and day value, with a zero year, e.g. an anniversary * A year on its own, with zero month and day values * A year and month value, with a zero day, e.g. a credit card expiration date Related types are google.type.TimeOfDay and `google.protobuf.Timestamp`.

See: date smart constructor.

Instances
Eq Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

Data Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: Date -> Constr #

dataTypeOf :: Date -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

showsPrec :: Int -> Date -> ShowS #

show :: Date -> String #

showList :: [Date] -> ShowS #

Generic Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep Date :: Type -> Type #

Methods

from :: Date -> Rep Date x #

to :: Rep Date x -> Date #

ToJSON Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Date Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep Date = D1 (MetaData "Date" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "Date'" PrefixI True) (S1 (MetaSel (Just "_dDay") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_dYear") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_dMonth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

date :: Date Source #

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

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

dDay :: Lens' Date (Maybe Int32) Source #

Day of month. Must be from 1 to 31 and valid for the year and month, or 0 if specifying a year by itself or a year and month where the day is not significant.

dYear :: Lens' Date (Maybe Int32) Source #

Year of date. Must be from 1 to 9999, or 0 if specifying a date without a year.

dMonth :: Lens' Date (Maybe Int32) Source #

Month of year. Must be from 1 to 12, or 0 if specifying a year without a month and day.

UpdateTransferJobRequest

data UpdateTransferJobRequest Source #

Request passed to UpdateTransferJob.

See: updateTransferJobRequest smart constructor.

Instances
Eq UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: UpdateTransferJobRequest -> Constr #

dataTypeOf :: UpdateTransferJobRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep UpdateTransferJobRequest :: Type -> Type #

ToJSON UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep UpdateTransferJobRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep UpdateTransferJobRequest = D1 (MetaData "UpdateTransferJobRequest" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "UpdateTransferJobRequest'" PrefixI True) (S1 (MetaSel (Just "_utjrTransferJob") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TransferJob)) :*: (S1 (MetaSel (Just "_utjrProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_utjrUpdateTransferJobFieldMask") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)))))

updateTransferJobRequest :: UpdateTransferJobRequest Source #

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

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

utjrTransferJob :: Lens' UpdateTransferJobRequest (Maybe TransferJob) Source #

The job to update. `transferJob` is expected to specify only three fields: `description`, `transferSpec`, and `status`. An UpdateTransferJobRequest that specifies other fields will be rejected with an error `INVALID_ARGUMENT`. Required.

utjrProjectId :: Lens' UpdateTransferJobRequest (Maybe Text) Source #

The ID of the Google Cloud Platform Console project that owns the job. Required.

utjrUpdateTransferJobFieldMask :: Lens' UpdateTransferJobRequest (Maybe GFieldMask) Source #

The field mask of the fields in `transferJob` that are to be updated in this request. Fields in `transferJob` that can be updated are: `description`, `transferSpec`, and `status`. To update the `transferSpec` of the job, a complete transfer specification has to be provided. An incomplete specification which misses any required fields will be rejected with the error `INVALID_ARGUMENT`.

TransferCounters

data TransferCounters Source #

A collection of counters that report the progress of a transfer operation.

See: transferCounters smart constructor.

Instances
Eq TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: TransferCounters -> Constr #

dataTypeOf :: TransferCounters -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep TransferCounters :: Type -> Type #

ToJSON TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferCounters Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferCounters = D1 (MetaData "TransferCounters" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "TransferCounters'" PrefixI True) ((((S1 (MetaSel (Just "_tcBytesFoundOnlyFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcBytesDeletedFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_tcObjectsDeletedFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcObjectsFoundFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) :*: ((S1 (MetaSel (Just "_tcBytesFailedToDeleteFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcBytesFromSourceFailed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_tcBytesCopiedToSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcBytesFoundFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) :*: (((S1 (MetaSel (Just "_tcBytesDeletedFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcObjectsDeletedFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_tcObjectsFoundOnlyFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcBytesFromSourceSkippedBySync") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) :*: ((S1 (MetaSel (Just "_tcObjectsCopiedToSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcObjectsFromSourceFailed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_tcObjectsFailedToDeleteFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_tcObjectsFromSourceSkippedBySync") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))))

tcBytesFoundOnlyFromSink :: Lens' TransferCounters (Maybe Int64) Source #

Bytes found only in the data sink that are scheduled to be deleted.

tcBytesDeletedFromSink :: Lens' TransferCounters (Maybe Int64) Source #

Bytes that are deleted from the data sink.

tcObjectsDeletedFromSource :: Lens' TransferCounters (Maybe Int64) Source #

Objects that are deleted from the data source.

tcObjectsFoundFromSource :: Lens' TransferCounters (Maybe Int64) Source #

Objects found in the data source that are scheduled to be transferred, excluding any that are filtered based on object conditions or skipped due to sync.

tcBytesFailedToDeleteFromSink :: Lens' TransferCounters (Maybe Int64) Source #

Bytes that failed to be deleted from the data sink.

tcBytesFromSourceFailed :: Lens' TransferCounters (Maybe Int64) Source #

Bytes in the data source that failed to be transferred or that failed to be deleted after being transferred.

tcBytesCopiedToSink :: Lens' TransferCounters (Maybe Int64) Source #

Bytes that are copied to the data sink.

tcBytesFoundFromSource :: Lens' TransferCounters (Maybe Int64) Source #

Bytes found in the data source that are scheduled to be transferred, excluding any that are filtered based on object conditions or skipped due to sync.

tcBytesDeletedFromSource :: Lens' TransferCounters (Maybe Int64) Source #

Bytes that are deleted from the data source.

tcObjectsDeletedFromSink :: Lens' TransferCounters (Maybe Int64) Source #

Objects that are deleted from the data sink.

tcObjectsFoundOnlyFromSink :: Lens' TransferCounters (Maybe Int64) Source #

Objects found only in the data sink that are scheduled to be deleted.

tcBytesFromSourceSkippedBySync :: Lens' TransferCounters (Maybe Int64) Source #

Bytes in the data source that are not transferred because they already exist in the data sink.

tcObjectsCopiedToSink :: Lens' TransferCounters (Maybe Int64) Source #

Objects that are copied to the data sink.

tcObjectsFromSourceFailed :: Lens' TransferCounters (Maybe Int64) Source #

Objects in the data source that failed to be transferred or that failed to be deleted after being transferred.

tcObjectsFailedToDeleteFromSink :: Lens' TransferCounters (Maybe Int64) Source #

Objects that failed to be deleted from the data sink.

tcObjectsFromSourceSkippedBySync :: Lens' TransferCounters (Maybe Int64) Source #

Objects in the data source that are not transferred because they already exist in the data sink.

TransferJob

data TransferJob Source #

This resource represents the configuration of a transfer job that runs periodically.

See: transferJob smart constructor.

Instances
Eq TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: TransferJob -> Constr #

dataTypeOf :: TransferJob -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep TransferJob :: Type -> Type #

ToJSON TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferJob Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

transferJob :: TransferJob Source #

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

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

tjCreationTime :: Lens' TransferJob (Maybe UTCTime) Source #

This field cannot be changed by user requests.

tjStatus :: Lens' TransferJob (Maybe TransferJobStatus) Source #

Status of the job. This value MUST be specified for `CreateTransferJobRequests`. NOTE: The effect of the new job status takes place during a subsequent job run. For example, if you change the job status from `ENABLED` to `DISABLED`, and an operation spawned by the transfer is running, the status change would not affect the current operation.

tjSchedule :: Lens' TransferJob (Maybe Schedule) Source #

Schedule specification.

tjDeletionTime :: Lens' TransferJob (Maybe UTCTime) Source #

This field cannot be changed by user requests.

tjName :: Lens' TransferJob (Maybe Text) Source #

A globally unique name assigned by Storage Transfer Service when the job is created. This field should be left empty in requests to create a new transfer job; otherwise, the requests result in an `INVALID_ARGUMENT` error.

tjProjectId :: Lens' TransferJob (Maybe Text) Source #

The ID of the Google Cloud Platform Console project that owns the job.

tjDescription :: Lens' TransferJob (Maybe Text) Source #

A description provided by the user for the job. Its max length is 1024 bytes when Unicode-encoded.

tjLastModificationTime :: Lens' TransferJob (Maybe UTCTime) Source #

This field cannot be changed by user requests.

GcsData

data GcsData Source #

In a GcsData resource, an object's name is the Google Cloud Storage object's name and its `lastModificationTime` refers to the object's updated time, which changes when the content or the metadata of the object is updated.

See: gcsData smart constructor.

Instances
Eq GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

Data GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: GcsData -> Constr #

dataTypeOf :: GcsData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep GcsData :: Type -> Type #

Methods

from :: GcsData -> Rep GcsData x #

to :: Rep GcsData x -> GcsData #

ToJSON GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep GcsData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep GcsData = D1 (MetaData "GcsData" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" True) (C1 (MetaCons "GcsData'" PrefixI True) (S1 (MetaSel (Just "_gdBucketName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

gcsData :: GcsData Source #

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

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

gdBucketName :: Lens' GcsData (Maybe Text) Source #

Google Cloud Storage bucket name (see Bucket Name Requirements). Required.

Xgafv

data Xgafv Source #

V1 error format.

Constructors

X1

1 v1 error format

X2

2 v2 error format

Instances
Enum Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

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

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

toConstr :: Xgafv -> Constr #

dataTypeOf :: Xgafv -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

compare :: Xgafv -> Xgafv -> Ordering #

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

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

(>) :: Xgafv -> Xgafv -> Bool #

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

max :: Xgafv -> Xgafv -> Xgafv #

min :: Xgafv -> Xgafv -> Xgafv #

Read Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Associated Types

type Rep Xgafv :: Type -> Type #

Methods

from :: Xgafv -> Rep Xgafv x #

to :: Rep Xgafv x -> Xgafv #

Hashable Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.StorageTransfer.Types.Sum" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

AwsS3Data

data AwsS3Data Source #

An AwsS3Data resource can be a data source, but not a data sink. In an AwsS3Data resource, an object's name is the S3 object's key name.

See: awsS3Data smart constructor.

Instances
Eq AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: AwsS3Data -> Constr #

dataTypeOf :: AwsS3Data -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep AwsS3Data :: Type -> Type #

ToJSON AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep AwsS3Data Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep AwsS3Data = D1 (MetaData "AwsS3Data" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "AwsS3Data'" PrefixI True) (S1 (MetaSel (Just "_asdBucketName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_asdAwsAccessKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AwsAccessKey))))

awsS3Data :: AwsS3Data Source #

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

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

asdBucketName :: Lens' AwsS3Data (Maybe Text) Source #

S3 Bucket name (see Creating a bucket). Required.

asdAwsAccessKey :: Lens' AwsS3Data (Maybe AwsAccessKey) Source #

AWS access key used to sign the API requests to the AWS S3 bucket. Permissions on the bucket must be granted to the access ID of the AWS access key. Required.

TransferJobStatus

data TransferJobStatus Source #

Status of the job. This value MUST be specified for `CreateTransferJobRequests`. NOTE: The effect of the new job status takes place during a subsequent job run. For example, if you change the job status from `ENABLED` to `DISABLED`, and an operation spawned by the transfer is running, the status change would not affect the current operation.

Constructors

TJSStatusUnspecified

STATUS_UNSPECIFIED Zero is an illegal value.

TJSEnabled

ENABLED New transfers will be performed based on the schedule.

TJSDisabled

DISABLED New transfers will not be scheduled.

TJSDeleted

DELETED This is a soft delete state. After a transfer job is set to this state, the job and all the transfer executions are subject to garbage collection. Transfer jobs become eligible for garbage collection 30 days after their status is set to `DELETED`.

Instances
Enum TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Eq TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Data TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

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

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

toConstr :: TransferJobStatus -> Constr #

dataTypeOf :: TransferJobStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Read TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Show TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Generic TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Associated Types

type Rep TransferJobStatus :: Type -> Type #

Hashable TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToJSON TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromJSON TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromHttpApiData TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToHttpApiData TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep TransferJobStatus Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep TransferJobStatus = D1 (MetaData "TransferJobStatus" "Network.Google.StorageTransfer.Types.Sum" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) ((C1 (MetaCons "TJSStatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TJSEnabled" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TJSDisabled" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TJSDeleted" PrefixI False) (U1 :: Type -> Type)))

HTTPData

data HTTPData Source #

An HttpData resource specifies a list of objects on the web to be transferred over HTTP. The information of the objects to be transferred is contained in a file referenced by a URL. The first line in the file must be "TsvHttpData-1.0", which specifies the format of the file. Subsequent lines specify the information of the list of objects, one object per list entry. Each entry has the following tab-delimited fields: * HTTP URL - The location of the object. * Length - The size of the object in bytes. * MD5 - The base64-encoded MD5 hash of the object. For an example of a valid TSV file, see Transferring data from URLs. When transferring data based on a URL list, keep the following in mind: * When an object located at `http(s)://hostname:port/` is transferred to a data sink, the name of the object at the data sink is `/`. * If the specified size of an object does not match the actual size of the object fetched, the object will not be transferred. * If the specified MD5 does not match the MD5 computed from the transferred bytes, the object transfer will fail. For more information, see Generating MD5 hashes * Ensure that each URL you specify is publicly accessible. For example, in Google Cloud Storage you can share an object publicly and get a link to it. * Storage Transfer Service obeys `robots.txt` rules and requires the source HTTP server to support `Range` requests and to return a `Content-Length` header in each response. * ObjectConditions have no effect when filtering objects to transfer.

See: hTTPData smart constructor.

Instances
Eq HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: HTTPData -> Constr #

dataTypeOf :: HTTPData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep HTTPData :: Type -> Type #

Methods

from :: HTTPData -> Rep HTTPData x #

to :: Rep HTTPData x -> HTTPData #

ToJSON HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep HTTPData Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep HTTPData = D1 (MetaData "HTTPData" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" True) (C1 (MetaCons "HTTPData'" PrefixI True) (S1 (MetaSel (Just "_httpdListURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

hTTPData :: HTTPData Source #

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

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

httpdListURL :: Lens' HTTPData (Maybe Text) Source #

The URL that points to the file that stores the object list entries. This file must allow public access. Currently, only URLs with HTTP and HTTPS schemes are supported. Required.

TimeOfDay'

data TimeOfDay' Source #

Represents a time of day. The date and time zone are either not significant or are specified elsewhere. An API may choose to allow leap seconds. Related types are google.type.Date and `google.protobuf.Timestamp`.

See: timeOfDay smart constructor.

Instances
Eq TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: TimeOfDay' -> Constr #

dataTypeOf :: TimeOfDay' -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep TimeOfDay' :: Type -> Type #

ToJSON TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TimeOfDay' Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TimeOfDay' = D1 (MetaData "TimeOfDay'" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "TimeOfDay''" PrefixI True) ((S1 (MetaSel (Just "_todNanos") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_todHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_todMinutes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_todSeconds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

timeOfDay :: TimeOfDay' Source #

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

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

todNanos :: Lens' TimeOfDay' (Maybe Int32) Source #

Fractions of seconds in nanoseconds. Must be from 0 to 999,999,999.

todHours :: Lens' TimeOfDay' (Maybe Int32) Source #

Hours of day in 24 hour format. Should be from 0 to 23. An API may choose to allow the value "24:00:00" for scenarios like business closing time.

todMinutes :: Lens' TimeOfDay' (Maybe Int32) Source #

Minutes of hour of day. Must be from 0 to 59.

todSeconds :: Lens' TimeOfDay' (Maybe Int32) Source #

Seconds of minutes of the time. Must normally be from 0 to 59. An API may allow the value 60 if it allows leap-seconds.

ErrorLogEntry

data ErrorLogEntry Source #

An entry describing an error that has occurred.

See: errorLogEntry smart constructor.

Instances
Eq ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: ErrorLogEntry -> Constr #

dataTypeOf :: ErrorLogEntry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep ErrorLogEntry :: Type -> Type #

ToJSON ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ErrorLogEntry Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ErrorLogEntry = D1 (MetaData "ErrorLogEntry" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "ErrorLogEntry'" PrefixI True) (S1 (MetaSel (Just "_eleURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eleErrorDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))

errorLogEntry :: ErrorLogEntry Source #

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

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

eleURL :: Lens' ErrorLogEntry (Maybe Text) Source #

A URL that refers to the target (a data source, a data sink, or an object) with which the error is associated. Required.

eleErrorDetails :: Lens' ErrorLogEntry [Text] Source #

A list of messages that carry the error details.

OperationMetadata

data OperationMetadata Source #

Represents the transfer operation object.

See: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: OperationMetadata -> Constr #

dataTypeOf :: OperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" True) (C1 (MetaCons "OperationMetadata'" PrefixI True) (S1 (MetaSel (Just "_omAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadata Source #

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

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

omAddtional :: Lens' OperationMetadata (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

TransferOptions

data TransferOptions Source #

TransferOptions uses three boolean parameters to define the actions to be performed on objects in a transfer.

See: transferOptions smart constructor.

Instances
Eq TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: TransferOptions -> Constr #

dataTypeOf :: TransferOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep TransferOptions :: Type -> Type #

ToJSON TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferOptions Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferOptions = D1 (MetaData "TransferOptions" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "TransferOptions'" PrefixI True) (S1 (MetaSel (Just "_toDeleteObjectsUniqueInSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_toDeleteObjectsFromSourceAfterTransfer") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_toOverwriteObjectsAlreadyExistingInSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

transferOptions :: TransferOptions Source #

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

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

toDeleteObjectsUniqueInSink :: Lens' TransferOptions (Maybe Bool) Source #

Whether objects that exist only in the sink should be deleted. Note that this option and `deleteObjectsFromSourceAfterTransfer` are mutually exclusive.

toDeleteObjectsFromSourceAfterTransfer :: Lens' TransferOptions (Maybe Bool) Source #

Whether objects should be deleted from the source after they are transferred to the sink. Note that this option and `deleteObjectsUniqueInSink` are mutually exclusive.

toOverwriteObjectsAlreadyExistingInSink :: Lens' TransferOptions (Maybe Bool) Source #

Whether overwriting objects that already exist in the sink is allowed.

TransferOperation

data TransferOperation Source #

A description of the execution of a transfer.

See: transferOperation smart constructor.

Instances
Eq TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: TransferOperation -> Constr #

dataTypeOf :: TransferOperation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep TransferOperation :: Type -> Type #

ToJSON TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferOperation Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

transferOperation :: TransferOperation Source #

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

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

toStatus :: Lens' TransferOperation (Maybe TransferOperationStatus) Source #

Status of the transfer operation.

toCounters :: Lens' TransferOperation (Maybe TransferCounters) Source #

Information about the progress of the transfer operation.

toStartTime :: Lens' TransferOperation (Maybe UTCTime) Source #

Start time of this transfer execution.

toTransferJobName :: Lens' TransferOperation (Maybe Text) Source #

The name of the transfer job that triggers this transfer operation.

toName :: Lens' TransferOperation (Maybe Text) Source #

A globally unique ID assigned by the system.

toEndTime :: Lens' TransferOperation (Maybe UTCTime) Source #

End time of this transfer execution.

toProjectId :: Lens' TransferOperation (Maybe Text) Source #

The ID of the Google Cloud Platform Console project that owns the operation. Required.

toTransferSpec :: Lens' TransferOperation (Maybe TransferSpec) Source #

Transfer specification. Required.

toErrorBreakdowns :: Lens' TransferOperation [ErrorSummary] Source #

Summarizes errors encountered with sample error log entries.

TransferSpec

data TransferSpec Source #

Configuration for running a transfer.

See: transferSpec smart constructor.

Instances
Eq TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: TransferSpec -> Constr #

dataTypeOf :: TransferSpec -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep TransferSpec :: Type -> Type #

ToJSON TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferSpec Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep TransferSpec = D1 (MetaData "TransferSpec" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "TransferSpec'" PrefixI True) ((S1 (MetaSel (Just "_tsGcsDataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GcsData)) :*: (S1 (MetaSel (Just "_tsObjectConditions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ObjectConditions)) :*: S1 (MetaSel (Just "_tsHTTPDataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HTTPData)))) :*: (S1 (MetaSel (Just "_tsAwsS3DataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AwsS3Data)) :*: (S1 (MetaSel (Just "_tsGcsDataSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GcsData)) :*: S1 (MetaSel (Just "_tsTransferOptions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TransferOptions))))))

transferSpec :: TransferSpec Source #

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

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

tsGcsDataSource :: Lens' TransferSpec (Maybe GcsData) Source #

A Google Cloud Storage data source.

tsObjectConditions :: Lens' TransferSpec (Maybe ObjectConditions) Source #

Only objects that satisfy these object conditions are included in the set of data source and data sink objects. Object conditions based on objects' `lastModificationTime` do not exclude objects in a data sink.

tsGcsDataSink :: Lens' TransferSpec (Maybe GcsData) Source #

A Google Cloud Storage data sink.

tsTransferOptions :: Lens' TransferSpec (Maybe TransferOptions) Source #

If the option `deleteObjectsUniqueInSink` is `true`, object conditions based on objects' `lastModificationTime` are ignored and do not exclude objects in a data source or a data sink.

ListTransferJobsResponse

data ListTransferJobsResponse Source #

Response from ListTransferJobs.

See: listTransferJobsResponse smart constructor.

Instances
Eq ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: ListTransferJobsResponse -> Constr #

dataTypeOf :: ListTransferJobsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep ListTransferJobsResponse :: Type -> Type #

ToJSON ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ListTransferJobsResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ListTransferJobsResponse = D1 (MetaData "ListTransferJobsResponse" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "ListTransferJobsResponse'" PrefixI True) (S1 (MetaSel (Just "_ltjrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ltjrTransferJobs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [TransferJob]))))

listTransferJobsResponse :: ListTransferJobsResponse Source #

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

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

OperationResponse

data OperationResponse Source #

The normal response of the operation in case of success. If the original method returns no data on success, such as `Delete`, the response is `google.protobuf.Empty`. If the original method is standard `Get`/`Create`/`Update`, the response should be the resource. For other methods, the response should have the type `XxxResponse`, where `Xxx` is the original method name. For example, if the original method name is `TakeSnapshot()`, the inferred response type is `TakeSnapshotResponse`.

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: OperationResponse -> Constr #

dataTypeOf :: OperationResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" True) (C1 (MetaCons "OperationResponse'" PrefixI True) (S1 (MetaSel (Just "_orAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationResponse Source #

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

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

orAddtional :: Lens' OperationResponse (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

ResumeTransferOperationRequest

data ResumeTransferOperationRequest Source #

Request passed to ResumeTransferOperation.

See: resumeTransferOperationRequest smart constructor.

Instances
Eq ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: ResumeTransferOperationRequest -> Constr #

dataTypeOf :: ResumeTransferOperationRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep ResumeTransferOperationRequest :: Type -> Type #

ToJSON ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ResumeTransferOperationRequest Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep ResumeTransferOperationRequest = D1 (MetaData "ResumeTransferOperationRequest" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "ResumeTransferOperationRequest'" PrefixI False) (U1 :: Type -> Type))

resumeTransferOperationRequest :: ResumeTransferOperationRequest Source #

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

AwsAccessKey

data AwsAccessKey Source #

AWS access key (see AWS Security Credentials).

See: awsAccessKey smart constructor.

Instances
Eq AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Data AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Methods

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

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

toConstr :: AwsAccessKey -> Constr #

dataTypeOf :: AwsAccessKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Generic AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

Associated Types

type Rep AwsAccessKey :: Type -> Type #

ToJSON AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

FromJSON AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep AwsAccessKey Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Product

type Rep AwsAccessKey = D1 (MetaData "AwsAccessKey" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) (C1 (MetaCons "AwsAccessKey'" PrefixI True) (S1 (MetaSel (Just "_aakSecretAccessKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aakAccessKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

awsAccessKey :: AwsAccessKey Source #

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

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

aakSecretAccessKey :: Lens' AwsAccessKey (Maybe Text) Source #

AWS secret access key. This field is not returned in RPC responses. Required.

aakAccessKeyId :: Lens' AwsAccessKey (Maybe Text) Source #

AWS access key ID. Required.

ErrorSummaryErrorCode

data ErrorSummaryErrorCode Source #

Required.

Constructors

ESECOK

OK Not an error; returned on success HTTP Mapping: 200 OK

ESECCancelled

CANCELLED The operation was cancelled, typically by the caller. HTTP Mapping: 499 Client Closed Request

ESECUnknown

UNKNOWN Unknown error. For example, this error may be returned when a `Status` value received from another address space belongs to an error space that is not known in this address space. Also errors raised by APIs that do not return enough error information may be converted to this error. HTTP Mapping: 500 Internal Server Error

ESECInvalidArgument

INVALID_ARGUMENT The client specified an invalid argument. Note that this differs from `FAILED_PRECONDITION`. `INVALID_ARGUMENT` indicates arguments that are problematic regardless of the state of the system (e.g., a malformed file name). HTTP Mapping: 400 Bad Request

ESECDeadlineExceeded

DEADLINE_EXCEEDED The deadline expired before the operation could complete. For operations that change the state of the system, this error may be returned even if the operation has completed successfully. For example, a successful response from a server could have been delayed long enough for the deadline to expire. HTTP Mapping: 504 Gateway Timeout

ESECNotFound

NOT_FOUND Some requested entity (e.g., file or directory) was not found. Note to server developers: if a request is denied for an entire class of users, such as gradual feature rollout or undocumented whitelist, `NOT_FOUND` may be used. If a request is denied for some users within a class of users, such as user-based access control, `PERMISSION_DENIED` must be used. HTTP Mapping: 404 Not Found

ESECAlreadyExists

ALREADY_EXISTS The entity that a client attempted to create (e.g., file or directory) already exists. HTTP Mapping: 409 Conflict

ESECPermissionDenied

PERMISSION_DENIED The caller does not have permission to execute the specified operation. `PERMISSION_DENIED` must not be used for rejections caused by exhausting some resource (use `RESOURCE_EXHAUSTED` instead for those errors). `PERMISSION_DENIED` must not be used if the caller can not be identified (use `UNAUTHENTICATED` instead for those errors). This error code does not imply the request is valid or the requested entity exists or satisfies other pre-conditions. HTTP Mapping: 403 Forbidden

ESECUnauthenticated

UNAUTHENTICATED The request does not have valid authentication credentials for the operation. HTTP Mapping: 401 Unauthorized

ESECResourceExhausted

RESOURCE_EXHAUSTED Some resource has been exhausted, perhaps a per-user quota, or perhaps the entire file system is out of space. HTTP Mapping: 429 Too Many Requests

ESECFailedPrecondition

FAILED_PRECONDITION The operation was rejected because the system is not in a state required for the operation's execution. For example, the directory to be deleted is non-empty, an rmdir operation is applied to a non-directory, etc. Service implementors can use the following guidelines to decide between `FAILED_PRECONDITION`, `ABORTED`, and `UNAVAILABLE`: (a) Use `UNAVAILABLE` if the client can retry just the failing call. (b) Use `ABORTED` if the client should retry at a higher level (e.g., when a client-specified test-and-set fails, indicating the client should restart a read-modify-write sequence). (c) Use `FAILED_PRECONDITION` if the client should not retry until the system state has been explicitly fixed. E.g., if an "rmdir" fails because the directory is non-empty, `FAILED_PRECONDITION` should be returned since the client should not retry unless the files are deleted from the directory. HTTP Mapping: 400 Bad Request

ESECAborted

ABORTED The operation was aborted, typically due to a concurrency issue such as a sequencer check failure or transaction abort. See the guidelines above for deciding between `FAILED_PRECONDITION`, `ABORTED`, and `UNAVAILABLE`. HTTP Mapping: 409 Conflict

ESECOutOfRange

OUT_OF_RANGE The operation was attempted past the valid range. E.g., seeking or reading past end-of-file. Unlike `INVALID_ARGUMENT`, this error indicates a problem that may be fixed if the system state changes. For example, a 32-bit file system will generate `INVALID_ARGUMENT` if asked to read at an offset that is not in the range [0,2^32-1], but it will generate `OUT_OF_RANGE` if asked to read from an offset past the current file size. There is a fair bit of overlap between `FAILED_PRECONDITION` and `OUT_OF_RANGE`. We recommend using `OUT_OF_RANGE` (the more specific error) when it applies so that callers who are iterating through a space can easily look for an `OUT_OF_RANGE` error to detect when they are done. HTTP Mapping: 400 Bad Request

ESECUnimplemented

UNIMPLEMENTED The operation is not implemented or is not supported/enabled in this service. HTTP Mapping: 501 Not Implemented

ESECInternal

INTERNAL Internal errors. This means that some invariants expected by the underlying system have been broken. This error code is reserved for serious errors. HTTP Mapping: 500 Internal Server Error

ESECUnavailable

UNAVAILABLE The service is currently unavailable. This is most likely a transient condition, which can be corrected by retrying with a backoff. See the guidelines above for deciding between `FAILED_PRECONDITION`, `ABORTED`, and `UNAVAILABLE`. HTTP Mapping: 503 Service Unavailable

ESECDataLoss

DATA_LOSS Unrecoverable data loss or corruption. HTTP Mapping: 500 Internal Server Error

Instances
Enum ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Eq ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Data ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Methods

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

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

toConstr :: ErrorSummaryErrorCode -> Constr #

dataTypeOf :: ErrorSummaryErrorCode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Read ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Show ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Generic ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

Associated Types

type Rep ErrorSummaryErrorCode :: Type -> Type #

Hashable ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToJSON ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromJSON ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

FromHttpApiData ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

ToHttpApiData ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep ErrorSummaryErrorCode Source # 
Instance details

Defined in Network.Google.StorageTransfer.Types.Sum

type Rep ErrorSummaryErrorCode = D1 (MetaData "ErrorSummaryErrorCode" "Network.Google.StorageTransfer.Types.Sum" "gogol-storage-transfer-0.4.0-GGwHgHZplO0LWcGDc7JAZR" False) ((((C1 (MetaCons "ESECOK" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECCancelled" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ESECUnknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECInvalidArgument" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "ESECDeadlineExceeded" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECNotFound" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ESECAlreadyExists" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECPermissionDenied" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "ESECUnauthenticated" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECResourceExhausted" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ESECFailedPrecondition" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECAborted" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "ESECOutOfRange" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECUnimplemented" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ESECInternal" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ESECUnavailable" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ESECDataLoss" PrefixI False) (U1 :: Type -> Type))))))