gogol-storage-transfer-0.3.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

Contents

Description

Transfers data from external data sources to a Google Cloud Storage bucket or between Google Cloud Storage buckets.

See: Google Storage Transfer API Reference

Synopsis

Service Configuration

storageTransferService :: ServiceConfig Source #

Default request referring to version v1 of the Google 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

API Declaration

Resources

storagetransfer.getGoogleServiceAccount

storagetransfer.googleServiceAccounts.get

storagetransfer.transferJobs.create

storagetransfer.transferJobs.get

storagetransfer.transferJobs.list

storagetransfer.transferJobs.patch

storagetransfer.transferOperations.cancel

storagetransfer.transferOperations.delete

storagetransfer.transferOperations.get

storagetransfer.transferOperations.list

storagetransfer.transferOperations.pause

storagetransfer.transferOperations.resume

Types

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 # 
Data ErrorSummary Source # 

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 # 
Generic ErrorSummary Source # 

Associated Types

type Rep ErrorSummary :: * -> * #

ToJSON ErrorSummary Source # 
FromJSON ErrorSummary Source # 
type Rep ErrorSummary Source # 
type Rep ErrorSummary = D1 (MetaData "ErrorSummary" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "ErrorSummary'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_esErrorCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) ((:*:) (S1 (MetaSel (Just Symbol "_esErrorCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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][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` which 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 purpose. - 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 # 

Methods

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

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

Data Status Source # 

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 # 
Generic Status Source # 

Associated Types

type Rep Status :: * -> * #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
FromJSON Status Source # 
type Rep Status Source # 
type Rep Status = D1 (MetaData "Status" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "Status'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StatusDetailsItem]))) ((:*:) (S1 (MetaSel (Just Symbol "_sCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_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 will be 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][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][google.rpc.Status.details] field, or localized by the client.

ListOperationsResponse

data ListOperationsResponse Source #

The response message for [Operations.ListOperations][google.longrunning.Operations.ListOperations].

See: listOperationsResponse smart constructor.

Instances

Eq ListOperationsResponse Source # 
Data ListOperationsResponse Source # 

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 # 
Generic ListOperationsResponse Source # 
ToJSON ListOperationsResponse Source # 
FromJSON ListOperationsResponse Source # 
type Rep ListOperationsResponse Source # 
type Rep ListOperationsResponse = D1 (MetaData "ListOperationsResponse" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "ListOperationsResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_lorNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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.

Schedule

data Schedule Source #

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

See: schedule smart constructor.

Instances

Eq Schedule Source # 
Data Schedule Source # 

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 # 
Generic Schedule Source # 

Associated Types

type Rep Schedule :: * -> * #

Methods

from :: Schedule -> Rep Schedule x #

to :: Rep Schedule x -> Schedule #

ToJSON Schedule Source # 
FromJSON Schedule Source # 
type Rep Schedule Source # 
type Rep Schedule = D1 (MetaData "Schedule" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "Schedule'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sScheduleEndDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Date))) ((:*:) (S1 (MetaSel (Just Symbol "_sScheduleStartDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Date))) (S1 (MetaSel (Just Symbol "_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. 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, transfers are scheduled to start at midnight UTC.

ObjectConditions

data ObjectConditions Source #

Conditions that determine which objects will be transferred.

See: objectConditions smart constructor.

Instances

Eq ObjectConditions Source # 
Data ObjectConditions Source # 

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 # 
Generic ObjectConditions Source # 
ToJSON ObjectConditions Source # 
FromJSON ObjectConditions Source # 
type Rep ObjectConditions Source # 
type Rep ObjectConditions = D1 (MetaData "ObjectConditions" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "ObjectConditions'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_ocMinTimeElapsedSinceLastModification") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_ocIncludePrefixes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))) ((:*:) (S1 (MetaSel (Just Symbol "_ocMaxTimeElapsedSinceLastModification") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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 Text) 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. * 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 20.

ocMaxTimeElapsedSinceLastModification :: Lens' ObjectConditions (Maybe Text) 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 20.

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 # 
Data Operation Source # 

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 # 
Generic Operation Source # 

Associated Types

type Rep Operation :: * -> * #

ToJSON Operation Source # 
FromJSON Operation Source # 
type Rep Operation Source # 

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 the `result` is available.

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

The error result of the operation in case of failure.

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 above, the `name` should have the format of `operations/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 # 

Methods

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

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

Data Empty Source # 

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 # 

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 

Associated Types

type Rep Empty :: * -> * #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
FromJSON Empty Source # 
type Rep Empty Source # 
type Rep Empty = D1 (MetaData "Empty" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "Empty'" PrefixI False) U1)

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 # 
Data PauseTransferOperationRequest Source # 

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 # 
Generic PauseTransferOperationRequest Source # 
ToJSON PauseTransferOperationRequest Source # 
FromJSON PauseTransferOperationRequest Source # 
type Rep PauseTransferOperationRequest Source # 
type Rep PauseTransferOperationRequest = D1 (MetaData "PauseTransferOperationRequest" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "PauseTransferOperationRequest'" PrefixI False) U1)

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 # 
Data GoogleServiceAccount Source # 

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 # 
Generic GoogleServiceAccount Source # 
ToJSON GoogleServiceAccount Source # 
FromJSON GoogleServiceAccount Source # 
type Rep GoogleServiceAccount Source # 
type Rep GoogleServiceAccount = D1 (MetaData "GoogleServiceAccount" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" True) (C1 (MetaCons "GoogleServiceAccount'" PrefixI True) (S1 (MetaSel (Just Symbol "_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 # 
Data StatusDetailsItem Source # 

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 # 
Generic StatusDetailsItem Source # 
ToJSON StatusDetailsItem Source # 
FromJSON StatusDetailsItem Source # 
type Rep StatusDetailsItem Source # 
type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" True) (C1 (MetaCons "StatusDetailsItem'" PrefixI True) (S1 (MetaSel (Just Symbol "_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 'ype with type URL.

Date

data Date Source #

Represents a whole calendar date, e.g. date of birth. The time of day and time zone are either specified elsewhere or are not significant. The date is relative to the Proleptic Gregorian Calendar. The day may be 0 to represent a year and month where the day is not significant, e.g. credit card expiration date. The year may be 0 to represent a month and day independent of year, e.g. anniversary date. Related types are [google.type.TimeOfDay][google.type.TimeOfDay] and `google.protobuf.Timestamp`.

See: date smart constructor.

Instances

Eq Date Source # 

Methods

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

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

Data Date Source # 

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 # 

Methods

showsPrec :: Int -> Date -> ShowS #

show :: Date -> String #

showList :: [Date] -> ShowS #

Generic Date Source # 

Associated Types

type Rep Date :: * -> * #

Methods

from :: Date -> Rep Date x #

to :: Rep Date x -> Date #

ToJSON Date Source # 
FromJSON Date Source # 
type Rep Date Source # 
type Rep Date = D1 (MetaData "Date" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "Date'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_dDay") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) ((:*:) (S1 (MetaSel (Just Symbol "_dYear") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_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/month where the day is not sigificant.

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

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

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

Month of year of date. Must be from 1 to 12.

UpdateTransferJobRequest

data UpdateTransferJobRequest Source #

Request passed to UpdateTransferJob.

See: updateTransferJobRequest smart constructor.

Instances

Eq UpdateTransferJobRequest Source # 
Data UpdateTransferJobRequest Source # 

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 # 
Generic UpdateTransferJobRequest Source # 
ToJSON UpdateTransferJobRequest Source # 
FromJSON UpdateTransferJobRequest Source # 
type Rep UpdateTransferJobRequest Source # 
type Rep UpdateTransferJobRequest = D1 (MetaData "UpdateTransferJobRequest" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "UpdateTransferJobRequest'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_utjrTransferJob") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TransferJob))) ((:*:) (S1 (MetaSel (Just Symbol "_utjrProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_utjrUpdateTransferJobFieldMask") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

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:

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

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

utjrUpdateTransferJobFieldMask :: Lens' UpdateTransferJobRequest (Maybe Text) 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 # 
Data TransferCounters Source # 

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 # 
Generic TransferCounters Source # 
ToJSON TransferCounters Source # 
FromJSON TransferCounters Source # 
type Rep TransferCounters Source # 
type Rep TransferCounters = D1 (MetaData "TransferCounters" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "TransferCounters'" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tcBytesFoundOnlyFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcBytesDeletedFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) ((:*:) (S1 (MetaSel (Just Symbol "_tcObjectsDeletedFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcObjectsFoundFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tcBytesFailedToDeleteFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcBytesFromSourceFailed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) ((:*:) (S1 (MetaSel (Just Symbol "_tcBytesCopiedToSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcBytesFoundFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tcBytesDeletedFromSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcObjectsDeletedFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) ((:*:) (S1 (MetaSel (Just Symbol "_tcObjectsFoundOnlyFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcBytesFromSourceSkippedBySync") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tcObjectsCopiedToSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_tcObjectsFromSourceFailed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) ((:*:) (S1 (MetaSel (Just Symbol "_tcObjectsFailedToDeleteFromSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_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, which will be copied, excluded based on conditions, or skipped due to failures.

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 during the transfer.

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, which will be copied, excluded based on conditions, or skipped due to failures.

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 during the transfer.

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 # 
Data TransferJob Source # 

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 # 
Generic TransferJob Source # 

Associated Types

type Rep TransferJob :: * -> * #

ToJSON TransferJob Source # 
FromJSON TransferJob Source # 
type Rep TransferJob Source # 

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 Text) Source #

This field cannot be changed by user requests.

tjStatus :: Lens' TransferJob (Maybe Text) 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. Required.

tjDeletionTime :: Lens' TransferJob (Maybe Text) 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 Developers Console project that owns the job. Required.

tjTransferSpec :: Lens' TransferJob (Maybe TransferSpec) Source #

Transfer specification. Required.

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 Text) Source #

This field cannot be changed by user requests.

GcsData

data GcsData Source #

In a GcsData, 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 # 

Methods

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

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

Data GcsData Source # 

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 # 
Generic GcsData Source # 

Associated Types

type Rep GcsData :: * -> * #

Methods

from :: GcsData -> Rep GcsData x #

to :: Rep GcsData x -> GcsData #

ToJSON GcsData Source # 
FromJSON GcsData Source # 
type Rep GcsData Source # 
type Rep GcsData = D1 (MetaData "GcsData" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" True) (C1 (MetaCons "GcsData'" PrefixI True) (S1 (MetaSel (Just Symbol "_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.

AwsS3Data

data AwsS3Data Source #

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

See: awsS3Data smart constructor.

Instances

Eq AwsS3Data Source # 
Data AwsS3Data Source # 

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 # 
Generic AwsS3Data Source # 

Associated Types

type Rep AwsS3Data :: * -> * #

ToJSON AwsS3Data Source # 
FromJSON AwsS3Data Source # 
type Rep AwsS3Data Source # 
type Rep AwsS3Data = D1 (MetaData "AwsS3Data" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "AwsS3Data'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_asdBucketName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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.

HTTPData

data HTTPData Source #

An HttpData 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 * Length * MD5 - This field is a base64-encoded MD5 hash of the object An HTTP URL that points to the object to be transferred. It must be a valid URL with URL scheme HTTP or HTTPS. When an object with URL `http(s)://hostname:port/` is transferred to the data sink, the name of the object at the data sink is `/`. Length and MD5 provide the size and the base64-encoded MD5 hash of the object. If Length does not match the actual length of the object fetched, the object will not be transferred. If MD5 does not match the MD5 computed from the transferred bytes, the object transfer will fail. `lastModificationTime` is not available in HttpData objects. The objects that the URL list points to must allow public access. Storage Transfer Service obeys `robots.txt` rules and requires the HTTP server to support Range requests and to return a Content-Length header in each response.

See: hTTPData smart constructor.

Instances

Eq HTTPData Source # 
Data HTTPData Source # 

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 # 
Generic HTTPData Source # 

Associated Types

type Rep HTTPData :: * -> * #

Methods

from :: HTTPData -> Rep HTTPData x #

to :: Rep HTTPData x -> HTTPData #

ToJSON HTTPData Source # 
FromJSON HTTPData Source # 
type Rep HTTPData Source # 
type Rep HTTPData = D1 (MetaData "HTTPData" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" True) (C1 (MetaCons "HTTPData'" PrefixI True) (S1 (MetaSel (Just Symbol "_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 chose to allow leap seconds. Related types are [google.type.Date][google.type.Date] and `google.protobuf.Timestamp`.

See: timeOfDay smart constructor.

Instances

Eq TimeOfDay' Source # 
Data TimeOfDay' Source # 

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 # 
Generic TimeOfDay' Source # 

Associated Types

type Rep TimeOfDay' :: * -> * #

ToJSON TimeOfDay' Source # 
FromJSON TimeOfDay' Source # 
type Rep TimeOfDay' Source # 
type Rep TimeOfDay' = D1 (MetaData "TimeOfDay'" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "TimeOfDay''" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_todNanos") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_todHours") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))) ((:*:) (S1 (MetaSel (Just Symbol "_todMinutes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_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 # 
Data ErrorLogEntry Source # 

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 # 
Generic ErrorLogEntry Source # 

Associated Types

type Rep ErrorLogEntry :: * -> * #

ToJSON ErrorLogEntry Source # 
FromJSON ErrorLogEntry Source # 
type Rep ErrorLogEntry Source # 
type Rep ErrorLogEntry = D1 (MetaData "ErrorLogEntry" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "ErrorLogEntry'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_eleURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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 # 
Data OperationMetadata Source # 

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 # 
Generic OperationMetadata Source # 
ToJSON OperationMetadata Source # 
FromJSON OperationMetadata Source # 
type Rep OperationMetadata Source # 
type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" True) (C1 (MetaCons "OperationMetadata'" PrefixI True) (S1 (MetaSel (Just Symbol "_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 'ype 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 # 
Data TransferOptions Source # 

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 # 
Generic TransferOptions Source # 
ToJSON TransferOptions Source # 
FromJSON TransferOptions Source # 
type Rep TransferOptions Source # 
type Rep TransferOptions = D1 (MetaData "TransferOptions" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "TransferOptions'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_toDeleteObjectsUniqueInSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_toDeleteObjectsFromSourceAfterTransfer") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_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.

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

Whether objects should be deleted from the source after they are transferred to the sink.

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 # 
Data TransferOperation Source # 

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 # 
Generic TransferOperation Source # 
ToJSON TransferOperation Source # 
FromJSON TransferOperation Source # 
type Rep TransferOperation Source # 

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 Text) Source #

Status of the transfer operation.

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

Information about the progress of the transfer operation.

toStartTime :: Lens' TransferOperation (Maybe Text) 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 Text) Source #

End time of this transfer execution.

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

The ID of the Google Developers 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 # 
Data TransferSpec Source # 

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 # 
Generic TransferSpec Source # 

Associated Types

type Rep TransferSpec :: * -> * #

ToJSON TransferSpec Source # 
FromJSON TransferSpec Source # 
type Rep TransferSpec Source # 
type Rep TransferSpec = D1 (MetaData "TransferSpec" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "TransferSpec'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tsGcsDataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GcsData))) ((:*:) (S1 (MetaSel (Just Symbol "_tsObjectConditions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ObjectConditions))) (S1 (MetaSel (Just Symbol "_tsHTTPDataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HTTPData))))) ((:*:) (S1 (MetaSel (Just Symbol "_tsAwsS3DataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AwsS3Data))) ((:*:) (S1 (MetaSel (Just Symbol "_tsGcsDataSink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GcsData))) (S1 (MetaSel (Just Symbol "_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 # 
Data ListTransferJobsResponse Source # 

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 # 
Generic ListTransferJobsResponse Source # 
ToJSON ListTransferJobsResponse Source # 
FromJSON ListTransferJobsResponse Source # 
type Rep ListTransferJobsResponse Source # 
type Rep ListTransferJobsResponse = D1 (MetaData "ListTransferJobsResponse" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "ListTransferJobsResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_ltjrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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 # 
Data OperationResponse Source # 

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 # 
Generic OperationResponse Source # 
ToJSON OperationResponse Source # 
FromJSON OperationResponse Source # 
type Rep OperationResponse Source # 
type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" True) (C1 (MetaCons "OperationResponse'" PrefixI True) (S1 (MetaSel (Just Symbol "_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 'ype with type URL.

ResumeTransferOperationRequest

data ResumeTransferOperationRequest Source #

Request passed to ResumeTransferOperation.

See: resumeTransferOperationRequest smart constructor.

Instances

Eq ResumeTransferOperationRequest Source # 
Data ResumeTransferOperationRequest Source # 

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 # 
Generic ResumeTransferOperationRequest Source # 
ToJSON ResumeTransferOperationRequest Source # 
FromJSON ResumeTransferOperationRequest Source # 
type Rep ResumeTransferOperationRequest Source # 
type Rep ResumeTransferOperationRequest = D1 (MetaData "ResumeTransferOperationRequest" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "ResumeTransferOperationRequest'" PrefixI False) U1)

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 # 
Data AwsAccessKey Source # 

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 # 
Generic AwsAccessKey Source # 

Associated Types

type Rep AwsAccessKey :: * -> * #

ToJSON AwsAccessKey Source # 
FromJSON AwsAccessKey Source # 
type Rep AwsAccessKey Source # 
type Rep AwsAccessKey = D1 (MetaData "AwsAccessKey" "Network.Google.StorageTransfer.Types.Product" "gogol-storage-transfer-0.3.0-DdvgDN2DYSs8eCRR6oXdxh" False) (C1 (MetaCons "AwsAccessKey'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_aakSecretAccessKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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.