gogol-remotebuildexecution-0.4.0: Google Remote Build Execution 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.RemoteBuildExecution.Types

Contents

Description

 
Synopsis

Service Configuration

remoteBuildExecutionService :: ServiceConfig Source #

Default request referring to version v2 of the Remote Build Execution 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

BuildBazelRemoteExecutionV2Digest

data BuildBazelRemoteExecutionV2Digest Source #

A content digest. A digest for a given blob consists of the size of the blob and its hash. The hash algorithm to use is defined by the server, but servers SHOULD use SHA-256. The size is considered to be an integral part of the digest and cannot be separated. That is, even if the `hash` field is correctly specified but `size_bytes` is not, the server MUST reject the request. The reason for including the size in the digest is as follows: in a great many cases, the server needs to know the size of the blob it is about to work with prior to starting an operation with it, such as flattening Merkle tree structures or streaming it to a worker. Technically, the server could implement a separate metadata store, but this results in a significantly more complicated implementation as opposed to having the client specify the size up-front (or storing the size along with the digest in every message where digests are embedded). This does mean that the API leaks some implementation details of (what we consider to be) a reasonable server implementation, but we consider this to be a worthwhile tradeoff. When a `Digest` is used to refer to a proto message, it always refers to the message in binary encoded form. To ensure consistent hashing, clients and servers MUST ensure that they serialize messages according to the following rules, even if there are alternate valid encodings for the same message. - Fields are serialized in tag order. - There are no unknown fields. - There are no duplicate fields. - Fields are serialized according to the default semantics for their type. Most protocol buffer implementations will always follow these rules when serializing, but care should be taken to avoid shortcuts. For instance, concatenating two messages to merge them may produce duplicate fields.

See: buildBazelRemoteExecutionV2Digest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2Digest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2Digest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep BuildBazelRemoteExecutionV2Digest :: Type -> Type #

ToJSON BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Digest = D1 (MetaData "BuildBazelRemoteExecutionV2Digest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2Digest'" PrefixI True) (S1 (MetaSel (Just "_bbrevdSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_bbrevdHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

buildBazelRemoteExecutionV2Digest :: BuildBazelRemoteExecutionV2Digest Source #

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

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

bbrevdHash :: Lens' BuildBazelRemoteExecutionV2Digest (Maybe Text) Source #

The hash. In the case of SHA-256, it will always be a lowercase hex string exactly 64 characters long.

GoogleRpcStatus

data GoogleRpcStatus 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: googleRpcStatus smart constructor.

Instances
Eq GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleRpcStatus -> Constr #

dataTypeOf :: GoogleRpcStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep GoogleRpcStatus :: Type -> Type #

ToJSON GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleRpcStatus Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleRpcStatus = D1 (MetaData "GoogleRpcStatus" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleRpcStatus'" PrefixI True) (S1 (MetaSel (Just "_grsDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleRpcStatusDetailsItem])) :*: (S1 (MetaSel (Just "_grsCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_grsMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

googleRpcStatus :: GoogleRpcStatus Source #

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

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

grsDetails :: Lens' GoogleRpcStatus [GoogleRpcStatusDetailsItem] Source #

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

grsCode :: Lens' GoogleRpcStatus (Maybe Int32) Source #

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

grsMessage :: Lens' GoogleRpcStatus (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.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source #

The request used for GetWorkerPool.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravgwprName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

gdravgwprName :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetWorkerPoolRequest (Maybe Text) Source #

Name of the worker pool to retrieve. Format: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]/workerpools/[POOL_ID]`.

GoogleDevtoolsRemoteexecutionV1testOutputDirectory

data GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source #

An `OutputDirectory` is the output in an `ActionResult` corresponding to a directory's full contents rather than a single file.

See: googleDevtoolsRemoteexecutionV1testOutputDirectory smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testOutputDirectory -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testOutputDirectory -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testOutputDirectory = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testOutputDirectory" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testOutputDirectory'" PrefixI True) (S1 (MetaSel (Just "_gdrvodPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdrvodDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest)) :*: S1 (MetaSel (Just "_gdrvodTreeDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest)))))

googleDevtoolsRemoteexecutionV1testOutputDirectory :: GoogleDevtoolsRemoteexecutionV1testOutputDirectory Source #

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

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

gdrvodPath :: Lens' GoogleDevtoolsRemoteexecutionV1testOutputDirectory (Maybe Text) Source #

The full path of the directory relative to the working directory. The path separator is a forward slash `/`. Since this is a relative path, it MUST NOT begin with a leading forward slash. The empty string value is allowed, and it denotes the entire working directory.

gdrvodTreeDigest :: Lens' GoogleDevtoolsRemoteexecutionV1testOutputDirectory (Maybe GoogleDevtoolsRemoteexecutionV1testDigest) Source #

The digest of the encoded Tree proto containing the directory's contents.

BuildBazelRemoteExecutionV2OutputSymlink

data BuildBazelRemoteExecutionV2OutputSymlink Source #

An `OutputSymlink` is similar to a Symlink, but it is used as an output in an `ActionResult`. `OutputSymlink` is binary-compatible with `SymlinkNode`.

See: buildBazelRemoteExecutionV2OutputSymlink smart constructor.

buildBazelRemoteExecutionV2OutputSymlink :: BuildBazelRemoteExecutionV2OutputSymlink Source #

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

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

bbrevosPath :: Lens' BuildBazelRemoteExecutionV2OutputSymlink (Maybe Text) Source #

The full path of the symlink relative to the working directory, including the filename. The path separator is a forward slash `/`. Since this is a relative path, it MUST NOT begin with a leading forward slash.

bbrevosTarget :: Lens' BuildBazelRemoteExecutionV2OutputSymlink (Maybe Text) Source #

The target path of the symlink. The path separator is a forward slash `/`. The target path can be relative to the parent directory of the symlink or it can be an absolute path starting with `/`. Support for absolute paths can be checked using the Capabilities API. The canonical form forbids the substrings `/./` and `//` in the target path. `..` components are allowed anywhere in the target path.

GoogleDevtoolsRemoteexecutionV1testTree

data GoogleDevtoolsRemoteexecutionV1testTree Source #

A `Tree` contains all the Directory protos in a single directory Merkle tree, compressed into one message.

See: googleDevtoolsRemoteexecutionV1testTree smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testTree -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testTree -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testTree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testTree = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testTree" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testTree'" PrefixI True) (S1 (MetaSel (Just "_gdrvtChildren") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteexecutionV1testDirectory])) :*: S1 (MetaSel (Just "_gdrvtRoot") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDirectory))))

googleDevtoolsRemoteexecutionV1testTree :: GoogleDevtoolsRemoteexecutionV1testTree Source #

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

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

gdrvtChildren :: Lens' GoogleDevtoolsRemoteexecutionV1testTree [GoogleDevtoolsRemoteexecutionV1testDirectory] Source #

All the child directories: the directories referred to by the root and, recursively, all its children. In order to reconstruct the directory tree, the client must take the digests of each of the child directories and then build up a tree starting from the `root`.

GoogleDevtoolsRemoteworkersV1test2FileMetadata

data GoogleDevtoolsRemoteworkersV1test2FileMetadata Source #

The metadata for a file. Similar to the equivalent message in the Remote Execution API.

See: googleDevtoolsRemoteworkersV1test2FileMetadata smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2FileMetadata -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2FileMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2FileMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2FileMetadata = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2FileMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2FileMetadata'" PrefixI True) ((S1 (MetaSel (Just "_gdrvfmContents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdrvfmPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdrvfmIsExecutable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gdrvfmDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2Digest)))))

googleDevtoolsRemoteworkersV1test2FileMetadata :: GoogleDevtoolsRemoteworkersV1test2FileMetadata Source #

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

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

gdrvfmContents :: Lens' GoogleDevtoolsRemoteworkersV1test2FileMetadata (Maybe ByteString) Source #

If the file is small enough, its contents may also or alternatively be listed here.

gdrvfmPath :: Lens' GoogleDevtoolsRemoteworkersV1test2FileMetadata (Maybe Text) Source #

The path of this file. If this message is part of the CommandOutputs.outputs fields, the path is relative to the execution root and must correspond to an entry in CommandTask.outputs.files. If this message is part of a Directory message, then the path is relative to the root of that directory. All paths MUST be delimited by forward slashes.

gdrvfmDigest :: Lens' GoogleDevtoolsRemoteworkersV1test2FileMetadata (Maybe GoogleDevtoolsRemoteworkersV1test2Digest) Source #

A pointer to the contents of the file. The method by which a client retrieves the contents from a CAS system is not defined here.

GoogleLongrunningOperationMetadata

data GoogleLongrunningOperationMetadata Source #

Service-specific metadata associated with the operation. It typically contains progress information and common metadata such as create time. Some services might not provide such metadata. Any method that returns a long-running operation should document the metadata type, if any.

See: googleLongrunningOperationMetadata smart constructor.

Instances
Eq GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleLongrunningOperationMetadata -> Constr #

dataTypeOf :: GoogleLongrunningOperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep GoogleLongrunningOperationMetadata :: Type -> Type #

ToJSON GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleLongrunningOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleLongrunningOperationMetadata = D1 (MetaData "GoogleLongrunningOperationMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleLongrunningOperationMetadata'" PrefixI True) (S1 (MetaSel (Just "_glomAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

googleLongrunningOperationMetadata Source #

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

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

glomAddtional :: Lens' GoogleLongrunningOperationMetadata (HashMap Text JSONValue) Source #

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

BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage

data BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source #

Constructors

Unknown
UNKNOWN
CacheCheck

CACHE_CHECK Checking the result against the cache.

Queued

QUEUED Currently idle, awaiting a free machine to execute.

Executing

EXECUTING Currently being executed by a worker.

Completed

COMPLETED Finished execution.

Instances
Enum BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage = D1 (MetaData "BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) ((C1 (MetaCons "Unknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CacheCheck" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Queued" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Executing" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Completed" PrefixI False) (U1 :: Type -> Type))))

GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source #

Output only. State of the instance.

Constructors

StateUnspecified

STATE_UNSPECIFIED Not a valid state, but the default value of the enum.

Creating

CREATING The instance is in state `CREATING` once `CreateInstance` is called and before the instance is ready for use.

Running

RUNNING The instance is in state `RUNNING` when it is ready for use.

Inactive

INACTIVE An `INACTIVE` instance indicates that there is a problem that needs to be fixed. Such instances cannot be used for execution and instances that remain in this state for a significant period of time will be removed permanently.

Instances
Enum GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) ((C1 (MetaCons "StateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Creating" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Running" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Inactive" PrefixI False) (U1 :: Type -> Type)))

GoogleDevtoolsRemoteworkersV1test2Digest

data GoogleDevtoolsRemoteworkersV1test2Digest Source #

The CommandTask and CommandResult messages assume the existence of a service that can serve blobs of content, identified by a hash and size known as a "digest." The method by which these blobs may be retrieved is not specified here, but a model implementation is in the Remote Execution API's "ContentAddressibleStorage" interface. In the context of the RWAPI, a Digest will virtually always refer to the contents of a file or a directory. The latter is represented by the byte-encoded Directory message.

See: googleDevtoolsRemoteworkersV1test2Digest smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2Digest -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2Digest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2Digest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2Digest = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2Digest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2Digest'" PrefixI True) (S1 (MetaSel (Just "_gdrvdSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gdrvdHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

googleDevtoolsRemoteworkersV1test2Digest :: GoogleDevtoolsRemoteworkersV1test2Digest Source #

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

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

gdrvdSizeBytes :: Lens' GoogleDevtoolsRemoteworkersV1test2Digest (Maybe Int64) Source #

The size of the contents. While this is not strictly required as part of an identifier (after all, any given hash will have exactly one canonical size), it's useful in almost all cases when one might want to send or retrieve blobs of content and is included here for this reason.

gdrvdHash :: Lens' GoogleDevtoolsRemoteworkersV1test2Digest (Maybe Text) Source #

A string-encoded hash (eg "1a2b3c", not the byte array [0x1a, 0x2b, 0x3c]) using an implementation-defined hash algorithm (eg SHA-256).

BuildBazelRemoteExecutionV2ServerCapabilities

data BuildBazelRemoteExecutionV2ServerCapabilities Source #

A response message for Capabilities.GetCapabilities.

See: buildBazelRemoteExecutionV2ServerCapabilities smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2ServerCapabilities -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ServerCapabilities -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ServerCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ServerCapabilities = D1 (MetaData "BuildBazelRemoteExecutionV2ServerCapabilities" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ServerCapabilities'" PrefixI True) ((S1 (MetaSel (Just "_bbrevscHighAPIVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelSemverSemVer)) :*: S1 (MetaSel (Just "_bbrevscExecutionCapabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ExecutionCapabilities))) :*: (S1 (MetaSel (Just "_bbrevscCacheCapabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2CacheCapabilities)) :*: (S1 (MetaSel (Just "_bbrevscDeprecatedAPIVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelSemverSemVer)) :*: S1 (MetaSel (Just "_bbrevscLowAPIVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelSemverSemVer))))))

bbrevscDeprecatedAPIVersion :: Lens' BuildBazelRemoteExecutionV2ServerCapabilities (Maybe BuildBazelSemverSemVer) Source #

Earliest RE API version supported, including deprecated versions.

BuildBazelRemoteExecutionV2Action

data BuildBazelRemoteExecutionV2Action Source #

An `Action` captures all the information about an execution which is required to reproduce it. `Action`s are the core component of the [Execution] service. A single `Action` represents a repeatable action that can be performed by the execution service. `Action`s can be succinctly identified by the digest of their wire format encoding and, once an `Action` has been executed, will be cached in the action cache. Future requests can then use the cached result rather than needing to run afresh. When a server completes execution of an Action, it MAY choose to cache the result in the ActionCache unless `do_not_cache` is `true`. Clients SHOULD expect the server to do so. By default, future calls to Execute the same `Action` will also serve their results from the cache. Clients must take care to understand the caching behaviour. Ideally, all `Action`s will be reproducible so that serving a result from cache is always desirable and correct.

See: buildBazelRemoteExecutionV2Action smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2Action -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2Action -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep BuildBazelRemoteExecutionV2Action :: Type -> Type #

ToJSON BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Action Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Action = D1 (MetaData "BuildBazelRemoteExecutionV2Action" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2Action'" PrefixI True) ((S1 (MetaSel (Just "_bbrevaDoNotCache") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bbrevaCommandDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest))) :*: (S1 (MetaSel (Just "_bbrevaInputRootDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)) :*: S1 (MetaSel (Just "_bbrevaTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)))))

buildBazelRemoteExecutionV2Action :: BuildBazelRemoteExecutionV2Action Source #

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

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

bbrevaDoNotCache :: Lens' BuildBazelRemoteExecutionV2Action (Maybe Bool) Source #

If true, then the `Action`'s result cannot be cached.

bbrevaCommandDigest :: Lens' BuildBazelRemoteExecutionV2Action (Maybe BuildBazelRemoteExecutionV2Digest) Source #

The digest of the Command to run, which MUST be present in the ContentAddressableStorage.

bbrevaInputRootDigest :: Lens' BuildBazelRemoteExecutionV2Action (Maybe BuildBazelRemoteExecutionV2Digest) Source #

The digest of the root Directory for the input files. The files in the directory tree are available in the correct location on the build machine before the command is executed. The root directory, as well as every subdirectory and content blob referred to, MUST be in the ContentAddressableStorage.

bbrevaTimeout :: Lens' BuildBazelRemoteExecutionV2Action (Maybe Scientific) Source #

A timeout after which the execution should be killed. If the timeout is absent, then the client is specifying that the execution should continue as long as the server will let it. The server SHOULD impose a timeout if the client does not specify one, however, if the client does specify a timeout that is longer than the server's maximum timeout, the server MUST reject the request. The timeout is a part of the Action message, and therefore two `Actions` with different timeouts are different, even if they are otherwise identical. This is because, if they were not, running an `Action` with a lower timeout than is required might result in a cache hit from an execution run with a longer timeout, hiding the fact that the timeout is too short. By encoding it directly in the `Action`, a lower timeout will result in a cache miss and the execution timeout will fail immediately, rather than whenever the cache entry gets evicted.

BuildBazelRemoteExecutionV2OutputDirectory

data BuildBazelRemoteExecutionV2OutputDirectory Source #

An `OutputDirectory` is the output in an `ActionResult` corresponding to a directory's full contents rather than a single file.

See: buildBazelRemoteExecutionV2OutputDirectory smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2OutputDirectory -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2OutputDirectory -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2OutputDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2OutputDirectory = D1 (MetaData "BuildBazelRemoteExecutionV2OutputDirectory" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2OutputDirectory'" PrefixI True) (S1 (MetaSel (Just "_bbrevodPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevodTreeDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest))))

buildBazelRemoteExecutionV2OutputDirectory :: BuildBazelRemoteExecutionV2OutputDirectory Source #

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

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

bbrevodPath :: Lens' BuildBazelRemoteExecutionV2OutputDirectory (Maybe Text) Source #

The full path of the directory relative to the working directory. The path separator is a forward slash `/`. Since this is a relative path, it MUST NOT begin with a leading forward slash. The empty string value is allowed, and it denotes the entire working directory.

bbrevodTreeDigest :: Lens' BuildBazelRemoteExecutionV2OutputDirectory (Maybe BuildBazelRemoteExecutionV2Digest) Source #

The digest of the encoded Tree proto containing the directory's contents.

GoogleDevtoolsRemoteexecutionV1testDigest

data GoogleDevtoolsRemoteexecutionV1testDigest Source #

A content digest. A digest for a given blob consists of the size of the blob and its hash. The hash algorithm to use is defined by the server, but servers SHOULD use SHA-256. The size is considered to be an integral part of the digest and cannot be separated. That is, even if the `hash` field is correctly specified but `size_bytes` is not, the server MUST reject the request. The reason for including the size in the digest is as follows: in a great many cases, the server needs to know the size of the blob it is about to work with prior to starting an operation with it, such as flattening Merkle tree structures or streaming it to a worker. Technically, the server could implement a separate metadata store, but this results in a significantly more complicated implementation as opposed to having the client specify the size up-front (or storing the size along with the digest in every message where digests are embedded). This does mean that the API leaks some implementation details of (what we consider to be) a reasonable server implementation, but we consider this to be a worthwhile tradeoff. When a `Digest` is used to refer to a proto message, it always refers to the message in binary encoded form. To ensure consistent hashing, clients and servers MUST ensure that they serialize messages according to the following rules, even if there are alternate valid encodings for the same message. - Fields are serialized in tag order. - There are no unknown fields. - There are no duplicate fields. - Fields are serialized according to the default semantics for their type. Most protocol buffer implementations will always follow these rules when serializing, but care should be taken to avoid shortcuts. For instance, concatenating two messages to merge them may produce duplicate fields.

See: googleDevtoolsRemoteexecutionV1testDigest smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testDigest -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testDigest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testDigest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testDigest = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testDigest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testDigest'" PrefixI True) (S1 (MetaSel (Just "_gSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

googleDevtoolsRemoteexecutionV1testDigest :: GoogleDevtoolsRemoteexecutionV1testDigest Source #

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

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

gHash :: Lens' GoogleDevtoolsRemoteexecutionV1testDigest (Maybe Text) Source #

The hash. In the case of SHA-256, it will always be a lowercase hex string exactly 64 characters long.

BuildBazelRemoteExecutionV2Tree

data BuildBazelRemoteExecutionV2Tree Source #

A `Tree` contains all the Directory protos in a single directory Merkle tree, compressed into one message.

See: buildBazelRemoteExecutionV2Tree smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2Tree -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2Tree -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep BuildBazelRemoteExecutionV2Tree :: Type -> Type #

ToJSON BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Tree Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Tree = D1 (MetaData "BuildBazelRemoteExecutionV2Tree" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2Tree'" PrefixI True) (S1 (MetaSel (Just "_bbrevtChildren") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2Directory])) :*: S1 (MetaSel (Just "_bbrevtRoot") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Directory))))

buildBazelRemoteExecutionV2Tree :: BuildBazelRemoteExecutionV2Tree Source #

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

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

bbrevtChildren :: Lens' BuildBazelRemoteExecutionV2Tree [BuildBazelRemoteExecutionV2Directory] Source #

All the child directories: the directories referred to by the root and, recursively, all its children. In order to reconstruct the directory tree, the client must take the digests of each of the child directories and then build up a tree starting from the `root`.

GoogleDevtoolsRemoteexecutionV1testActionResult

data GoogleDevtoolsRemoteexecutionV1testActionResult Source #

An ActionResult represents the result of an Action being run.

See: googleDevtoolsRemoteexecutionV1testActionResult smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testActionResult -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testActionResult -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testActionResult = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testActionResult" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testActionResult'" PrefixI True) ((S1 (MetaSel (Just "_gdrvarOutputDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteexecutionV1testOutputDirectory])) :*: (S1 (MetaSel (Just "_gdrvarOutputFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteexecutionV1testOutputFile])) :*: S1 (MetaSel (Just "_gdrvarStderrRaw") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)))) :*: ((S1 (MetaSel (Just "_gdrvarExitCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_gdrvarStdoutDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest))) :*: (S1 (MetaSel (Just "_gdrvarStderrDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest)) :*: S1 (MetaSel (Just "_gdrvarStdoutRaw") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))))))

gdrvarOutputDirectories :: Lens' GoogleDevtoolsRemoteexecutionV1testActionResult [GoogleDevtoolsRemoteexecutionV1testOutputDirectory] Source #

The output directories of the action. For each output directory requested in the `output_directories` field of the Action, if the corresponding directory existed after the action completed, a single entry will be present in the output list, which will contain the digest of a Tree message containing the directory tree, and the path equal exactly to the corresponding Action output_directories member. As an example, suppose the Action had an output directory `a/b/dir` and the execution produced the following contents in `a/b/dir`: a file named `bar` and a directory named `foo` with an executable file named `baz`. Then, output_directory will contain (hashes shortened for readability): ```json // OutputDirectory proto: { path: "a/b/dir" tree_digest: { hash: "4a73bc9d03...", size: 55 } } // Tree proto with hash "4a73bc9d03..." and size 55: { root: { files: [ { name: "bar", digest: { hash: "4a73bc9d03...", size: 65534 } } ], directories: [ { name: "foo", digest: { hash: "4cf2eda940...", size: 43 } } ] } children : { // (Directory proto with hash "4cf2eda940..." and size 43) files: [ { name: "baz", digest: { hash: "b2c941073e...", size: 1294, }, is_executable: true } ] } } ```

gdrvarOutputFiles :: Lens' GoogleDevtoolsRemoteexecutionV1testActionResult [GoogleDevtoolsRemoteexecutionV1testOutputFile] Source #

The output files of the action. For each output file requested in the `output_files` field of the Action, if the corresponding file existed after the action completed, a single entry will be present in the output list. If the action does not produce the requested output, or produces a directory where a regular file is expected or vice versa, then that output will be omitted from the list. The server is free to arrange the output list as desired; clients MUST NOT assume that the output list is sorted.

gdrvarStderrRaw :: Lens' GoogleDevtoolsRemoteexecutionV1testActionResult (Maybe ByteString) Source #

The standard error buffer of the action. The server will determine, based on the size of the buffer, whether to return it in raw form or to return a digest in `stderr_digest` that points to the buffer. If neither is set, then the buffer is empty. The client SHOULD NOT assume it will get one of the raw buffer or a digest on any given request and should be prepared to handle either.

gdrvarStdoutDigest :: Lens' GoogleDevtoolsRemoteexecutionV1testActionResult (Maybe GoogleDevtoolsRemoteexecutionV1testDigest) Source #

The digest for a blob containing the standard output of the action, which can be retrieved from the ContentAddressableStorage. See `stdout_raw` for when this will be set.

gdrvarStderrDigest :: Lens' GoogleDevtoolsRemoteexecutionV1testActionResult (Maybe GoogleDevtoolsRemoteexecutionV1testDigest) Source #

The digest for a blob containing the standard error of the action, which can be retrieved from the ContentAddressableStorage. See `stderr_raw` for when this will be set.

gdrvarStdoutRaw :: Lens' GoogleDevtoolsRemoteexecutionV1testActionResult (Maybe ByteString) Source #

The standard output buffer of the action. The server will determine, based on the size of the buffer, whether to return it in raw form or to return a digest in `stdout_digest` that points to the buffer. If neither is set, then the buffer is empty. The client SHOULD NOT assume it will get one of the raw buffer or a digest on any given request and should be prepared to handle either.

BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange

data BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source #

Supported range of priorities, including boundaries.

See: buildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange = D1 (MetaData "BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange'" PrefixI True) (S1 (MetaSel (Just "_bbrevpcprMinPriority") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_bbrevpcprMaxPriority") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

BuildBazelRemoteExecutionV2OutputFile

data BuildBazelRemoteExecutionV2OutputFile Source #

An `OutputFile` is similar to a FileNode, but it is used as an output in an `ActionResult`. It allows a full file path rather than only a name. `OutputFile` is binary-compatible with `FileNode`.

See: buildBazelRemoteExecutionV2OutputFile smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2OutputFile -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2OutputFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2OutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2OutputFile = D1 (MetaData "BuildBazelRemoteExecutionV2OutputFile" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2OutputFile'" PrefixI True) (S1 (MetaSel (Just "_bbrevofPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bbrevofIsExecutable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bbrevofDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)))))

buildBazelRemoteExecutionV2OutputFile :: BuildBazelRemoteExecutionV2OutputFile Source #

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

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

bbrevofPath :: Lens' BuildBazelRemoteExecutionV2OutputFile (Maybe Text) Source #

The full path of the file relative to the working directory, including the filename. The path separator is a forward slash `/`. Since this is a relative path, it MUST NOT begin with a leading forward slash.

bbrevofIsExecutable :: Lens' BuildBazelRemoteExecutionV2OutputFile (Maybe Bool) Source #

True if file is executable, false otherwise.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source #

The request used for `CreateInstance`.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravcirParent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdravcirInstanceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdravcirInstance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance)))))

gdravcirParent :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest (Maybe Text) Source #

Resource name of the project containing the instance. Format: `projects/[PROJECT_ID]`.

gdravcirInstanceId :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest (Maybe Text) Source #

ID of the created instance. A valid `instance_id` must: be 6-50 characters long, contains only lowercase letters, digits, hyphens and underscores, start with a lowercase letter, and end with a lowercase letter or a digit.

gdravcirInstance :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateInstanceRequest (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance) Source #

Specifies the instance to create. The name in the instance, if specified in the instance, is ignored.

BuildBazelRemoteExecutionV2Directory

data BuildBazelRemoteExecutionV2Directory Source #

A `Directory` represents a directory node in a file tree, containing zero or more children FileNodes, DirectoryNodes and SymlinkNodes. Each `Node` contains its name in the directory, either the digest of its content (either a file blob or a `Directory` proto) or a symlink target, as well as possibly some metadata about the file or directory. In order to ensure that two equivalent directory trees hash to the same value, the following restrictions MUST be obeyed when constructing a a `Directory`: - Every child in the directory must have a path of exactly one segment. Multiple levels of directory hierarchy may not be collapsed. - Each child in the directory must have a unique path segment (file name). - The files, directories and symlinks in the directory must each be sorted in lexicographical order by path. The path strings must be sorted by code point, equivalently, by UTF-8 bytes. A `Directory` that obeys the restrictions is said to be in canonical form. As an example, the following could be used for a file named `bar` and a directory named `foo` with an executable file named `baz` (hashes shortened for readability): ```json // (Directory proto) { files: [ { name: "bar", digest: { hash: "4a73bc9d03...", size: 65534 } } ], directories: [ { name: "foo", digest: { hash: "4cf2eda940...", size: 43 } } ] } // (Directory proto with hash "4cf2eda940..." and size 43) { files: [ { name: "baz", digest: { hash: "b2c941073e...", size: 1294, }, is_executable: true } ] } ```

See: buildBazelRemoteExecutionV2Directory smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2Directory -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2Directory -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Directory = D1 (MetaData "BuildBazelRemoteExecutionV2Directory" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2Directory'" PrefixI True) (S1 (MetaSel (Just "_bbrevdDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2DirectoryNode])) :*: (S1 (MetaSel (Just "_bbrevdSymlinks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2SymlinkNode])) :*: S1 (MetaSel (Just "_bbrevdFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2FileNode])))))

buildBazelRemoteExecutionV2Directory :: BuildBazelRemoteExecutionV2Directory Source #

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

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

BuildBazelRemoteExecutionV2DirectoryNode

data BuildBazelRemoteExecutionV2DirectoryNode Source #

A `DirectoryNode` represents a child of a Directory which is itself a `Directory` and its associated metadata.

See: buildBazelRemoteExecutionV2DirectoryNode smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2DirectoryNode -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2DirectoryNode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2DirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2DirectoryNode = D1 (MetaData "BuildBazelRemoteExecutionV2DirectoryNode" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2DirectoryNode'" PrefixI True) (S1 (MetaSel (Just "_bbrevdnName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevdnDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest))))

buildBazelRemoteExecutionV2DirectoryNode :: BuildBazelRemoteExecutionV2DirectoryNode Source #

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

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

bbrevdnDigest :: Lens' BuildBazelRemoteExecutionV2DirectoryNode (Maybe BuildBazelRemoteExecutionV2Digest) Source #

The digest of the Directory object represented. See Digest for information about how to take the digest of a proto message.

GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts

data GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source #

Describes the timeouts associated with this task.

See: googleDevtoolsRemoteworkersV1test2CommandTaskTimeouts smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts'" PrefixI True) (S1 (MetaSel (Just "_gdrvcttIdle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: (S1 (MetaSel (Just "_gdrvcttShutdown") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_gdrvcttExecution") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)))))

googleDevtoolsRemoteworkersV1test2CommandTaskTimeouts :: GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts Source #

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

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

gdrvcttIdle :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts (Maybe Scientific) Source #

This specifies the maximum amount of time the task can be idle - that is, go without generating some output in either stdout or stderr. If the process is silent for more than the specified time, the worker will terminate the task.

gdrvcttShutdown :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts (Maybe Scientific) Source #

If the execution or IO timeouts are exceeded, the worker will try to gracefully terminate the task and return any existing logs. However, tasks may be hard-frozen in which case this process will fail. This timeout specifies how long to wait for a terminated task to shut down gracefully (e.g. via SIGTERM) before we bring down the hammer (e.g. SIGKILL on *nix, CTRL_BREAK_EVENT on Windows).

gdrvcttExecution :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts (Maybe Scientific) Source #

This specifies the maximum time that the task can run, excluding the time required to download inputs or upload outputs. That is, the worker will terminate the task if it runs longer than this.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source #

Instance conceptually encapsulates all Remote Build Execution resources for remote builds. An instance consists of storage and compute resources (for example, `ContentAddressableStorage`, `ActionCache`, `WorkerPools`) used for running remote builds. All Remote Build Execution API calls are scoped to an instance.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaInstance smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance'" PrefixI True) (S1 (MetaSel (Just "_gdraviState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstanceState)) :*: (S1 (MetaSel (Just "_gdraviLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdraviName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

googleDevtoolsRemotebuildexecutionAdminV1alphaInstance :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance Source #

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

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

gdraviLocation :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance (Maybe Text) Source #

The location is a GCP region. Currently only `us-central1` is supported.

gdraviName :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance (Maybe Text) Source #

Output only. Instance resource name formatted as: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]`. Name should not be populated when creating an instance since it is provided in the `instance_id` field.

GoogleDevtoolsRemoteexecutionV1testToolDetails

data GoogleDevtoolsRemoteexecutionV1testToolDetails Source #

Details for the tool used to call the API.

See: googleDevtoolsRemoteexecutionV1testToolDetails smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testToolDetails -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testToolDetails -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testToolDetails = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testToolDetails" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testToolDetails'" PrefixI True) (S1 (MetaSel (Just "_gdrvtdToolName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvtdToolVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

googleDevtoolsRemoteexecutionV1testToolDetails :: GoogleDevtoolsRemoteexecutionV1testToolDetails Source #

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

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

gdrvtdToolVersion :: Lens' GoogleDevtoolsRemoteexecutionV1testToolDetails (Maybe Text) Source #

Version of the tool used for the request, e.g. 5.0.3.

BuildBazelRemoteExecutionV2ExecutionCapabilities

data BuildBazelRemoteExecutionV2ExecutionCapabilities Source #

Capabilities of the remote execution system.

See: buildBazelRemoteExecutionV2ExecutionCapabilities smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2ExecutionCapabilities -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecutionCapabilities -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecutionCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecutionCapabilities = D1 (MetaData "BuildBazelRemoteExecutionV2ExecutionCapabilities" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecutionCapabilities'" PrefixI True) (S1 (MetaSel (Just "_bbrevecExecutionPriorityCapabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2PriorityCapabilities)) :*: (S1 (MetaSel (Just "_bbrevecExecEnabled") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bbrevecDigestFunction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction)))))

bbrevecExecEnabled :: Lens' BuildBazelRemoteExecutionV2ExecutionCapabilities (Maybe Bool) Source #

Whether remote execution is enabled for the particular server/instance.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source #

The request used for UpdateWorkerPool.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravuwprUpdateMask") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)) :*: S1 (MetaSel (Just "_gdravuwprWorkerPool") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool))))

gdravuwprUpdateMask :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaUpdateWorkerPoolRequest (Maybe GFieldMask) Source #

The update mask applies to worker_pool. For the `FieldMask` definition, see https://developers.google.com/protocol-buffers/docs/reference/google.protobuf#fieldmask If an empty update_mask is provided, only the non-default valued field in the worker pool field will be updated. Note that in order to update a field to the default value (zero, false, empty string) an explicit update_mask must be provided.

BuildBazelRemoteExecutionV2BatchReadBlobsRequest

data BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source #

A request message for ContentAddressableStorage.BatchReadBlobs.

See: buildBazelRemoteExecutionV2BatchReadBlobsRequest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2BatchReadBlobsRequest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchReadBlobsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchReadBlobsRequest = D1 (MetaData "BuildBazelRemoteExecutionV2BatchReadBlobsRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchReadBlobsRequest'" PrefixI True) (S1 (MetaSel (Just "_bbrevbrbrDigests") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2Digest]))))

buildBazelRemoteExecutionV2BatchReadBlobsRequest :: BuildBazelRemoteExecutionV2BatchReadBlobsRequest Source #

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

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

GoogleDevtoolsRemoteexecutionV1testOutputFile

data GoogleDevtoolsRemoteexecutionV1testOutputFile Source #

An `OutputFile` is similar to a FileNode, but it is tailored for output as part of an `ActionResult`. It allows a full file path rather than only a name, and allows the server to include content inline. `OutputFile` is binary-compatible with `FileNode`.

See: googleDevtoolsRemoteexecutionV1testOutputFile smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testOutputFile -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testOutputFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testOutputFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testOutputFile = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testOutputFile" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testOutputFile'" PrefixI True) ((S1 (MetaSel (Just "_gdrvofPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvofContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) :*: (S1 (MetaSel (Just "_gdrvofIsExecutable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gdrvofDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest)))))

googleDevtoolsRemoteexecutionV1testOutputFile :: GoogleDevtoolsRemoteexecutionV1testOutputFile Source #

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

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

gdrvofPath :: Lens' GoogleDevtoolsRemoteexecutionV1testOutputFile (Maybe Text) Source #

The full path of the file relative to the input root, including the filename. The path separator is a forward slash `/`. Since this is a relative path, it MUST NOT begin with a leading forward slash.

gdrvofContent :: Lens' GoogleDevtoolsRemoteexecutionV1testOutputFile (Maybe ByteString) Source #

The raw content of the file. This field may be used by the server to provide the content of a file inline in an ActionResult and avoid requiring that the client make a separate call to [ContentAddressableStorage.GetBlob] to retrieve it. The client SHOULD NOT assume that it will get raw content with any request, and always be prepared to retrieve it via `digest`.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source #

A worker pool resource in the Remote Build Execution API.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool'" PrefixI True) ((S1 (MetaSel (Just "_gdravwpWorkerConfig") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig)) :*: S1 (MetaSel (Just "_gdravwpState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState))) :*: (S1 (MetaSel (Just "_gdravwpWorkerCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gdravwpName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

gdravwpWorkerConfig :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig) Source #

Specifies the properties, such as machine type and disk size, used for creating workers in a worker pool.

gdravwpWorkerCount :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool (Maybe Int64) Source #

The desired number of workers in the worker pool. Must be a value between 0 and 1000.

gdravwpName :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool (Maybe Text) Source #

WorkerPool resource name formatted as: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]/workerpools/[POOL_ID]`. name should not be populated when creating a worker pool since it is provided in the `poolId` field.

BuildBazelRemoteExecutionV2SymlinkNode

data BuildBazelRemoteExecutionV2SymlinkNode Source #

A `SymlinkNode` represents a symbolic link.

See: buildBazelRemoteExecutionV2SymlinkNode smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2SymlinkNode -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2SymlinkNode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2SymlinkNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2SymlinkNode = D1 (MetaData "BuildBazelRemoteExecutionV2SymlinkNode" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2SymlinkNode'" PrefixI True) (S1 (MetaSel (Just "_bbrevsnName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevsnTarget") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

buildBazelRemoteExecutionV2SymlinkNode :: BuildBazelRemoteExecutionV2SymlinkNode Source #

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

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

bbrevsnTarget :: Lens' BuildBazelRemoteExecutionV2SymlinkNode (Maybe Text) Source #

The target path of the symlink. The path separator is a forward slash `/`. The target path can be relative to the parent directory of the symlink or it can be an absolute path starting with `/`. Support for absolute paths can be checked using the Capabilities API. The canonical form forbids the substrings `/./` and `//` in the target path. `..` components are allowed anywhere in the target path.

GoogleRpcStatusDetailsItem

data GoogleRpcStatusDetailsItem Source #

Instances
Eq GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleRpcStatusDetailsItem -> Constr #

dataTypeOf :: GoogleRpcStatusDetailsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep GoogleRpcStatusDetailsItem :: Type -> Type #

ToJSON GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleRpcStatusDetailsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleRpcStatusDetailsItem = D1 (MetaData "GoogleRpcStatusDetailsItem" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleRpcStatusDetailsItem'" PrefixI True) (S1 (MetaSel (Just "_grsdiAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

googleRpcStatusDetailsItem Source #

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

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

grsdiAddtional :: Lens' GoogleRpcStatusDetailsItem (HashMap Text JSONValue) Source #

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

GoogleDevtoolsRemoteexecutionV1testDirectoryNode

data GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source #

A `DirectoryNode` represents a child of a Directory which is itself a `Directory` and its associated metadata.

See: googleDevtoolsRemoteexecutionV1testDirectoryNode smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testDirectoryNode -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testDirectoryNode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testDirectoryNode = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testDirectoryNode" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testDirectoryNode'" PrefixI True) (S1 (MetaSel (Just "_gdrvdnName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvdnDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest))))

googleDevtoolsRemoteexecutionV1testDirectoryNode :: GoogleDevtoolsRemoteexecutionV1testDirectoryNode Source #

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

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

gdrvdnDigest :: Lens' GoogleDevtoolsRemoteexecutionV1testDirectoryNode (Maybe GoogleDevtoolsRemoteexecutionV1testDigest) Source #

The digest of the Directory object represented. See Digest for information about how to take the digest of a proto message.

GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata

data GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source #

The metadata for a directory. Similar to the equivalent message in the Remote Execution API.

See: googleDevtoolsRemoteworkersV1test2DirectoryMetadata smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata'" PrefixI True) (S1 (MetaSel (Just "_gdrvdmPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvdmDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2Digest))))

googleDevtoolsRemoteworkersV1test2DirectoryMetadata :: GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata Source #

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

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

gdrvdmPath :: Lens' GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata (Maybe Text) Source #

The path of the directory, as in FileMetadata.path.

gdrvdmDigest :: Lens' GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata (Maybe GoogleDevtoolsRemoteworkersV1test2Digest) Source #

A pointer to the contents of the directory, in the form of a marshalled Directory message.

GoogleDevtoolsRemoteexecutionV1testDirectory

data GoogleDevtoolsRemoteexecutionV1testDirectory Source #

A `Directory` represents a directory node in a file tree, containing zero or more children FileNodes and DirectoryNodes. Each `Node` contains its name in the directory, the digest of its content (either a file blob or a `Directory` proto), as well as possibly some metadata about the file or directory. In order to ensure that two equivalent directory trees hash to the same value, the following restrictions MUST be obeyed when constructing a a `Directory`: - Every child in the directory must have a path of exactly one segment. Multiple levels of directory hierarchy may not be collapsed. - Each child in the directory must have a unique path segment (file name). - The files and directories in the directory must each be sorted in lexicographical order by path. The path strings must be sorted by code point, equivalently, by UTF-8 bytes. A `Directory` that obeys the restrictions is said to be in canonical form. As an example, the following could be used for a file named `bar` and a directory named `foo` with an executable file named `baz` (hashes shortened for readability): ```json // (Directory proto) { files: [ { name: "bar", digest: { hash: "4a73bc9d03...", size: 65534 } } ], directories: [ { name: "foo", digest: { hash: "4cf2eda940...", size: 43 } } ] } // (Directory proto with hash "4cf2eda940..." and size 43) { files: [ { name: "baz", digest: { hash: "b2c941073e...", size: 1294, }, is_executable: true } ] } ```

See: googleDevtoolsRemoteexecutionV1testDirectory smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testDirectory -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testDirectory -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testDirectory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testDirectory = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testDirectory" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testDirectory'" PrefixI True) (S1 (MetaSel (Just "_gdrvdDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteexecutionV1testDirectoryNode])) :*: S1 (MetaSel (Just "_gdrvdFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteexecutionV1testFileNode]))))

googleDevtoolsRemoteexecutionV1testDirectory :: GoogleDevtoolsRemoteexecutionV1testDirectory Source #

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

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

BuildBazelRemoteExecutionV2ActionResult

data BuildBazelRemoteExecutionV2ActionResult Source #

An ActionResult represents the result of an Action being run.

See: buildBazelRemoteExecutionV2ActionResult smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2ActionResult -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ActionResult -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ActionResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ActionResult = D1 (MetaData "BuildBazelRemoteExecutionV2ActionResult" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ActionResult'" PrefixI True) (((S1 (MetaSel (Just "_bbrevarExecutionMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ExecutedActionMetadata)) :*: S1 (MetaSel (Just "_bbrevarOutputDirectorySymlinks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2OutputSymlink]))) :*: (S1 (MetaSel (Just "_bbrevarOutputFileSymlinks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2OutputSymlink])) :*: (S1 (MetaSel (Just "_bbrevarOutputDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2OutputDirectory])) :*: S1 (MetaSel (Just "_bbrevarOutputFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2OutputFile]))))) :*: ((S1 (MetaSel (Just "_bbrevarStderrRaw") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_bbrevarExitCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_bbrevarStdoutDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)) :*: (S1 (MetaSel (Just "_bbrevarStderrDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)) :*: S1 (MetaSel (Just "_bbrevarStdoutRaw") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)))))))

bbrevarOutputDirectorySymlinks :: Lens' BuildBazelRemoteExecutionV2ActionResult [BuildBazelRemoteExecutionV2OutputSymlink] Source #

The output directories of the action that are symbolic links to other directories. Those may be links to other output directories, or input directories, or even absolute paths outside of the working directory, if the server supports SymlinkAbsolutePathStrategy.ALLOWED. For each output directory requested in the `output_directories` field of the Action, if the directory file existed after the action completed, a single entry will be present either in this field, or in the `output_directories` field, if the directory was not a symbolic link. If the action does not produce the requested output, or produces a file where a directory is expected or vice versa, then that output will be omitted from the list. The server is free to arrange the output list as desired; clients MUST NOT assume that the output list is sorted.

bbrevarOutputFileSymlinks :: Lens' BuildBazelRemoteExecutionV2ActionResult [BuildBazelRemoteExecutionV2OutputSymlink] Source #

The output files of the action that are symbolic links to other files. Those may be links to other output files, or input files, or even absolute paths outside of the working directory, if the server supports SymlinkAbsolutePathStrategy.ALLOWED. For each output file requested in the `output_files` field of the Action, if the corresponding file existed after the action completed, a single entry will be present either in this field, or in the `output_files` field, if the file was not a symbolic link. If the action does not produce the requested output, or produces a directory where a regular file is expected or vice versa, then that output will be omitted from the list. The server is free to arrange the output list as desired; clients MUST NOT assume that the output list is sorted.

bbrevarOutputDirectories :: Lens' BuildBazelRemoteExecutionV2ActionResult [BuildBazelRemoteExecutionV2OutputDirectory] Source #

The output directories of the action. For each output directory requested in the `output_directories` field of the Action, if the corresponding directory existed after the action completed, a single entry will be present in the output list, which will contain the digest of a Tree message containing the directory tree, and the path equal exactly to the corresponding Action output_directories member. As an example, suppose the Action had an output directory `a/b/dir` and the execution produced the following contents in `a/b/dir`: a file named `bar` and a directory named `foo` with an executable file named `baz`. Then, output_directory will contain (hashes shortened for readability): ```json // OutputDirectory proto: { path: "a/b/dir" tree_digest: { hash: "4a73bc9d03...", size: 55 } } // Tree proto with hash "4a73bc9d03..." and size 55: { root: { files: [ { name: "bar", digest: { hash: "4a73bc9d03...", size: 65534 } } ], directories: [ { name: "foo", digest: { hash: "4cf2eda940...", size: 43 } } ] } children : { // (Directory proto with hash "4cf2eda940..." and size 43) files: [ { name: "baz", digest: { hash: "b2c941073e...", size: 1294, }, is_executable: true } ] } } ```

bbrevarOutputFiles :: Lens' BuildBazelRemoteExecutionV2ActionResult [BuildBazelRemoteExecutionV2OutputFile] Source #

The output files of the action. For each output file requested in the `output_files` field of the Action, if the corresponding file existed after the action completed, a single entry will be present either in this field, or in the output_file_symlinks field, if the file was a symbolic link to another file. If the action does not produce the requested output, or produces a directory where a regular file is expected or vice versa, then that output will be omitted from the list. The server is free to arrange the output list as desired; clients MUST NOT assume that the output list is sorted.

bbrevarStderrRaw :: Lens' BuildBazelRemoteExecutionV2ActionResult (Maybe ByteString) Source #

The standard error buffer of the action. The server will determine, based on the size of the buffer, whether to return it in raw form or to return a digest in `stderr_digest` that points to the buffer. If neither is set, then the buffer is empty. The client SHOULD NOT assume it will get one of the raw buffer or a digest on any given request and should be prepared to handle either.

bbrevarStdoutDigest :: Lens' BuildBazelRemoteExecutionV2ActionResult (Maybe BuildBazelRemoteExecutionV2Digest) Source #

The digest for a blob containing the standard output of the action, which can be retrieved from the ContentAddressableStorage. See `stdout_raw` for when this will be set.

bbrevarStderrDigest :: Lens' BuildBazelRemoteExecutionV2ActionResult (Maybe BuildBazelRemoteExecutionV2Digest) Source #

The digest for a blob containing the standard error of the action, which can be retrieved from the ContentAddressableStorage. See `stderr_raw` for when this will be set.

bbrevarStdoutRaw :: Lens' BuildBazelRemoteExecutionV2ActionResult (Maybe ByteString) Source #

The standard output buffer of the action. The server will determine, based on the size of the buffer, whether to return it in raw form or to return a digest in `stdout_digest` that points to the buffer. If neither is set, then the buffer is empty. The client SHOULD NOT assume it will get one of the raw buffer or a digest on any given request and should be prepared to handle either.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source #

The request used for DeleteWorkerPool.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravdwprName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

gdravdwprName :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteWorkerPoolRequest (Maybe Text) Source #

Name of the worker pool to delete. Format: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]/workerpools/[POOL_ID]`.

GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable

data GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source #

An environment variable required by this task.

See: googleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable'" PrefixI True) (S1 (MetaSel (Just "_gdrvctievValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvctievName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

GoogleDevtoolsRemoteexecutionV1testExecuteResponse

data GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source #

The response message for Execution.Execute, which will be contained in the response field of the Operation.

See: googleDevtoolsRemoteexecutionV1testExecuteResponse smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testExecuteResponse -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testExecuteResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteResponse = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testExecuteResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testExecuteResponse'" PrefixI True) ((S1 (MetaSel (Just "_gdrverStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleRpcStatus)) :*: S1 (MetaSel (Just "_gdrverServerLogs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs))) :*: (S1 (MetaSel (Just "_gdrverResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testActionResult)) :*: S1 (MetaSel (Just "_gdrverCachedResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

gdrverStatus :: Lens' GoogleDevtoolsRemoteexecutionV1testExecuteResponse (Maybe GoogleRpcStatus) Source #

If the status has a code other than `OK`, it indicates that the action did not finish execution. For example, if the operation times out during execution, the status will have a `DEADLINE_EXCEEDED` code. Servers MUST use this field for errors in execution, rather than the error field on the `Operation` object. If the status code is other than `OK`, then the result MUST NOT be cached. For an error status, the `result` field is optional; the server may populate the output-, stdout-, and stderr-related fields if it has any information available, such as the stdout and stderr of a timed-out action.

gdrverServerLogs :: Lens' GoogleDevtoolsRemoteexecutionV1testExecuteResponse (Maybe GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs) Source #

An optional list of additional log outputs the server wishes to provide. A server can use this to return execution-specific logs however it wishes. This is intended primarily to make it easier for users to debug issues that may be outside of the actual job execution, such as by identifying the worker executing the action or by providing logs from the worker's setup phase. The keys SHOULD be human readable so that a client can display them to a user.

gdrverCachedResult :: Lens' GoogleDevtoolsRemoteexecutionV1testExecuteResponse (Maybe Bool) Source #

True if the result was served from cache, false if it was executed.

BuildBazelSemverSemVer

data BuildBazelSemverSemVer Source #

Instances
Eq BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelSemverSemVer -> Constr #

dataTypeOf :: BuildBazelSemverSemVer -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep BuildBazelSemverSemVer :: Type -> Type #

ToJSON BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelSemverSemVer Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelSemverSemVer = D1 (MetaData "BuildBazelSemverSemVer" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelSemverSemVer'" PrefixI True) ((S1 (MetaSel (Just "_bbssvMinor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_bbssvMajor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_bbssvPatch") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_bbssvPrerelease") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

buildBazelSemverSemVer :: BuildBazelSemverSemVer Source #

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

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

GoogleDevtoolsRemoteworkersV1test2CommandOverhead

data GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source #

DEPRECATED - use CommandResult instead. Can be used as part of CompleteRequest.metadata, or are part of a more sophisticated message.

See: googleDevtoolsRemoteworkersV1test2CommandOverhead smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandOverhead -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandOverhead -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandOverhead = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandOverhead" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandOverhead'" PrefixI True) (S1 (MetaSel (Just "_gdrvcoOverhead") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_gdrvcoDuration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration))))

googleDevtoolsRemoteworkersV1test2CommandOverhead :: GoogleDevtoolsRemoteworkersV1test2CommandOverhead Source #

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

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

gdrvcoOverhead :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandOverhead (Maybe Scientific) Source #

The amount of time *not* spent executing the command (ie uploading/downloading files).

gdrvcoDuration :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandOverhead (Maybe Scientific) Source #

The elapsed time between calling Accept and Complete. The server will also have its own idea of what this should be, but this excludes the overhead of the RPCs and the bot response time.

BuildBazelRemoteExecutionV2LogFile

data BuildBazelRemoteExecutionV2LogFile Source #

A `LogFile` is a log stored in the CAS.

See: buildBazelRemoteExecutionV2LogFile smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2LogFile -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2LogFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep BuildBazelRemoteExecutionV2LogFile :: Type -> Type #

ToJSON BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2LogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2LogFile = D1 (MetaData "BuildBazelRemoteExecutionV2LogFile" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2LogFile'" PrefixI True) (S1 (MetaSel (Just "_bbrevlfHumanReadable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bbrevlfDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest))))

buildBazelRemoteExecutionV2LogFile :: BuildBazelRemoteExecutionV2LogFile Source #

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

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

bbrevlfHumanReadable :: Lens' BuildBazelRemoteExecutionV2LogFile (Maybe Bool) Source #

This is a hint as to the purpose of the log, and is set to true if the log is human-readable text that can be usefully displayed to a user, and false otherwise. For instance, if a command-line client wishes to print the server logs to the terminal for a failed action, this allows it to avoid displaying a binary file.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source #

The request used for `CreateWorkerPool`.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravcwprParent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdravcwprPoolId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdravcwprWorkerPool") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool)))))

gdravcwprParent :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest (Maybe Text) Source #

Resource name of the instance in which to create the new worker pool. Format: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]`.

gdravcwprPoolId :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaCreateWorkerPoolRequest (Maybe Text) Source #

ID of the created worker pool. A valid pool ID must: be 6-50 characters long, contain only lowercase letters, digits, hyphens and underscores, start with a lowercase letter, and end with a lowercase letter or a digit.

GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable

data GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source #

An `EnvironmentVariable` is one variable to set in the running program's environment.

See: googleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable'" PrefixI True) (S1 (MetaSel (Just "_gdrvcevValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvcevName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

googleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable :: GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable Source #

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

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

BuildBazelRemoteExecutionV2FindMissingBlobsResponse

data BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source #

A response message for ContentAddressableStorage.FindMissingBlobs.

See: buildBazelRemoteExecutionV2FindMissingBlobsResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2FindMissingBlobsResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2FindMissingBlobsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2FindMissingBlobsResponse = D1 (MetaData "BuildBazelRemoteExecutionV2FindMissingBlobsResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2FindMissingBlobsResponse'" PrefixI True) (S1 (MetaSel (Just "_bbrevfmbrMissingBlobDigests") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2Digest]))))

buildBazelRemoteExecutionV2FindMissingBlobsResponse :: BuildBazelRemoteExecutionV2FindMissingBlobsResponse Source #

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

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

GoogleDevtoolsRemoteworkersV1test2Directory

data GoogleDevtoolsRemoteworkersV1test2Directory Source #

The contents of a directory. Similar to the equivalent message in the Remote Execution API.

See: googleDevtoolsRemoteworkersV1test2Directory smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2Directory -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2Directory -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2Directory Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2Directory = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2Directory" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2Directory'" PrefixI True) (S1 (MetaSel (Just "_gDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteworkersV1test2DirectoryMetadata])) :*: S1 (MetaSel (Just "_gFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteworkersV1test2FileMetadata]))))

googleDevtoolsRemoteworkersV1test2Directory :: GoogleDevtoolsRemoteworkersV1test2Directory Source #

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

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

GoogleDevtoolsRemoteexecutionV1testRequestMetadata

data GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source #

An optional Metadata to attach to any RPC request to tell the server about an external context of the request. The server may use this for logging or other purposes. To use it, the client attaches the header to the call using the canonical proto serialization: name: google.devtools.remoteexecution.v1test.requestmetadata-bin contents: the base64 encoded binary RequestMetadata message.

See: googleDevtoolsRemoteexecutionV1testRequestMetadata smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testRequestMetadata -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testRequestMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testRequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testRequestMetadata = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testRequestMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testRequestMetadata'" PrefixI True) ((S1 (MetaSel (Just "_gdrvrmCorrelatedInvocationsId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvrmToolInvocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdrvrmActionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrvrmToolDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testToolDetails)))))

gdrvrmCorrelatedInvocationsId :: Lens' GoogleDevtoolsRemoteexecutionV1testRequestMetadata (Maybe Text) Source #

An identifier to tie multiple tool invocations together. For example, runs of foo_test, bar_test and baz_test on a post-submit of a given patch.

gdrvrmToolInvocationId :: Lens' GoogleDevtoolsRemoteexecutionV1testRequestMetadata (Maybe Text) Source #

An identifier that ties multiple actions together to a final result. For example, multiple actions are required to build and run foo_test.

gdrvrmActionId :: Lens' GoogleDevtoolsRemoteexecutionV1testRequestMetadata (Maybe Text) Source #

An identifier that ties multiple requests to the same action. For example, multiple requests to the CAS, Action Cache, and Execution API are used in order to compile foo.cc.

BuildBazelRemoteExecutionV2ExecutionPolicy

data BuildBazelRemoteExecutionV2ExecutionPolicy Source #

An `ExecutionPolicy` can be used to control the scheduling of the action.

See: buildBazelRemoteExecutionV2ExecutionPolicy smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2ExecutionPolicy -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecutionPolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecutionPolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecutionPolicy = D1 (MetaData "BuildBazelRemoteExecutionV2ExecutionPolicy" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecutionPolicy'" PrefixI True) (S1 (MetaSel (Just "_bbrevepPriority") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

buildBazelRemoteExecutionV2ExecutionPolicy :: BuildBazelRemoteExecutionV2ExecutionPolicy Source #

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

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

bbrevepPriority :: Lens' BuildBazelRemoteExecutionV2ExecutionPolicy (Maybe Int32) Source #

The priority (relative importance) of this action. Generally, a lower value means that the action should be run sooner than actions having a greater priority value, but the interpretation of a given value is server- dependent. A priority of 0 means the *default* priority. Priorities may be positive or negative, and such actions should run later or sooner than actions having the default priority, respectively. The particular semantics of this field is up to the server. In particular, every server will have their own supported range of priorities, and will decide how these map into scheduling policy.

BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities

data BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source #

Describes the server/instance capabilities for updating the action cache.

See: buildBazelRemoteExecutionV2ActionCacheUpdateCapabilities smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities = D1 (MetaData "BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities'" PrefixI True) (S1 (MetaSel (Just "_bbrevacucUpdateEnabled") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bool))))

buildBazelRemoteExecutionV2ActionCacheUpdateCapabilities :: BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities Source #

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

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

BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest

data BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source #

A request corresponding to a single blob that the client wants to upload.

See: buildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest = D1 (MetaData "BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest'" PrefixI True) (S1 (MetaSel (Just "_bbrevbubrrData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_bbrevbubrrDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest))))

buildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest :: BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest Source #

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

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

GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source #

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsResponse'" PrefixI True) (S1 (MetaSel (Just "_gdravlwprWorkerPools") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPool]))))

GoogleDevtoolsRemoteworkersV1test2CommandResult

data GoogleDevtoolsRemoteworkersV1test2CommandResult Source #

All information about the execution of a command, suitable for providing as the Bots interface's `Lease.result` field.

See: googleDevtoolsRemoteworkersV1test2CommandResult smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandResult -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandResult -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandResult Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandResult = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandResult" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandResult'" PrefixI True) ((S1 (MetaSel (Just "_gdrvcrStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleRpcStatus)) :*: (S1 (MetaSel (Just "_gdrvcrOverhead") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_gdrvcrOutputs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2Digest)))) :*: (S1 (MetaSel (Just "_gdrvcrExitCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_gdrvcrStatistics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem])) :*: S1 (MetaSel (Just "_gdrvcrDuration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration))))))

gdrvcrStatus :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandResult (Maybe GoogleRpcStatus) Source #

An overall status for the command. For example, if the command timed out, this might have a code of DEADLINE_EXCEEDED; if it was killed by the OS for memory exhaustion, it might have a code of RESOURCE_EXHAUSTED.

gdrvcrOverhead :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandResult (Maybe Scientific) Source #

The amount of time *not* spent executing the command (ie uploading/downloading files).

gdrvcrOutputs :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandResult (Maybe GoogleDevtoolsRemoteworkersV1test2Digest) Source #

The output files. The blob referenced by the digest should contain one of the following (implementation-dependent): * A marshalled DirectoryMetadata of the returned filesystem * A LUCI-style .isolated file

gdrvcrExitCode :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandResult (Maybe Int32) Source #

The exit code of the process. An exit code of "0" should only be trusted if `status` has a code of OK (otherwise it may simply be unset).

gdrvcrStatistics :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandResult [GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem] Source #

Implementation-dependent statistics about the task. Both servers and bots may define messages which can be encoded here; bots are free to provide statistics in multiple formats, and servers are free to choose one or more of the values to process and ignore others. In particular, it is *not* considered an error for the bot to provide the server with a field that it doesn't know about.

gdrvcrDuration :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandResult (Maybe Scientific) Source #

The elapsed time between calling Accept and Complete. The server will also have its own idea of what this should be, but this excludes the overhead of the RPCs and the bot response time.

GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage

data GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source #

Constructors

GDRVEOMSUnknown
UNKNOWN
GDRVEOMSCacheCheck

CACHE_CHECK Checking the result against the cache.

GDRVEOMSQueued

QUEUED Currently idle, awaiting a free machine to execute.

GDRVEOMSExecuting

EXECUTING Currently being executed by a worker.

GDRVEOMSCompleted

COMPLETED Finished execution.

Instances
Enum GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) ((C1 (MetaCons "GDRVEOMSUnknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDRVEOMSCacheCheck" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "GDRVEOMSQueued" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GDRVEOMSExecuting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDRVEOMSCompleted" PrefixI False) (U1 :: Type -> Type))))

GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem

data GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source #

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandResultStatisticsItem'" PrefixI True) (S1 (MetaSel (Just "_gdrvcrsiAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

GoogleDevtoolsRemoteexecutionV1testFileNode

data GoogleDevtoolsRemoteexecutionV1testFileNode Source #

A `FileNode` represents a single file and associated metadata.

See: googleDevtoolsRemoteexecutionV1testFileNode smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteexecutionV1testFileNode -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testFileNode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testFileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testFileNode = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testFileNode" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testFileNode'" PrefixI True) (S1 (MetaSel (Just "_gdrvfnName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdrvfnIsExecutable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gdrvfnDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest)))))

googleDevtoolsRemoteexecutionV1testFileNode :: GoogleDevtoolsRemoteexecutionV1testFileNode Source #

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

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

gdrvfnIsExecutable :: Lens' GoogleDevtoolsRemoteexecutionV1testFileNode (Maybe Bool) Source #

True if file is executable, false otherwise.

GoogleDevtoolsRemoteworkersV1test2AdminTemp

data GoogleDevtoolsRemoteworkersV1test2AdminTemp Source #

AdminTemp is a prelimiary set of administration tasks. It's called "Temp" because we do not yet know the best way to represent admin tasks; it's possible that this will be entirely replaced in later versions of this API. If this message proves to be sufficient, it will be renamed in the alpha or beta release of this API. This message (suitably marshalled into a protobuf.Any) can be used as the inline_assignment field in a lease; the lease assignment field should simply be `"admin"` in these cases. This message is heavily based on Swarming administration tasks from the LUCI project (http://github.com/luci/luci-py/appengine/swarming).

See: googleDevtoolsRemoteworkersV1test2AdminTemp smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2AdminTemp -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2AdminTemp -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2AdminTemp Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2AdminTemp = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2AdminTemp" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2AdminTemp'" PrefixI True) (S1 (MetaSel (Just "_gdrvatCommand") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2AdminTempCommand)) :*: S1 (MetaSel (Just "_gdrvatArg") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

googleDevtoolsRemoteworkersV1test2AdminTemp :: GoogleDevtoolsRemoteworkersV1test2AdminTemp Source #

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

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

gdrvatArg :: Lens' GoogleDevtoolsRemoteworkersV1test2AdminTemp (Maybe Text) Source #

The argument to the admin action; see `Command` for semantics.

GoogleDevtoolsRemotebuildbotCommandDurations

data GoogleDevtoolsRemotebuildbotCommandDurations Source #

CommandDuration contains the various duration metrics tracked when a bot performs a command.

See: googleDevtoolsRemotebuildbotCommandDurations smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildbotCommandDurations -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildbotCommandDurations -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildbotCommandDurations Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildbotCommandDurations = D1 (MetaData "GoogleDevtoolsRemotebuildbotCommandDurations" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildbotCommandDurations'" PrefixI True) ((S1 (MetaSel (Just "_gdrcdStdout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: (S1 (MetaSel (Just "_gdrcdDockerPrep") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_gdrcdDownload") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)))) :*: ((S1 (MetaSel (Just "_gdrcdOverall") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_gdrcdExecution") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration))) :*: (S1 (MetaSel (Just "_gdrcdIsoPrepDone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_gdrcdUpload") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration))))))

gdrcdDockerPrep :: Lens' GoogleDevtoolsRemotebuildbotCommandDurations (Maybe Scientific) Source #

The time spent preparing the command to be run in a Docker container (includes pulling the Docker image, if necessary).

gdrcdDownload :: Lens' GoogleDevtoolsRemotebuildbotCommandDurations (Maybe Scientific) Source #

The time spent downloading the input files and constructing the working directory.

gdrcdOverall :: Lens' GoogleDevtoolsRemotebuildbotCommandDurations (Maybe Scientific) Source #

The time spent completing the command, in total.

gdrcdExecution :: Lens' GoogleDevtoolsRemotebuildbotCommandDurations (Maybe Scientific) Source #

The time spent executing the command (i.e., doing useful work).

gdrcdIsoPrepDone :: Lens' GoogleDevtoolsRemotebuildbotCommandDurations (Maybe UTCTime) Source #

The timestamp when preparation is done and bot starts downloading files.

BuildBazelRemoteExecutionV2PlatformProperty

data BuildBazelRemoteExecutionV2PlatformProperty Source #

A single property for the environment. The server is responsible for specifying the property `name`s that it accepts. If an unknown `name` is provided in the requirements for an Action, the server SHOULD reject the execution request. If permitted by the server, the same `name` may occur multiple times. The server is also responsible for specifying the interpretation of property `value`s. For instance, a property describing how much RAM must be available may be interpreted as allowing a worker with 16GB to fulfill a request for 8GB, while a property describing the OS environment on which the action must be performed may require an exact match with the worker's OS. The server MAY use the `value` of one or more properties to determine how it sets up the execution environment, such as by making specific system files available to the worker.

See: buildBazelRemoteExecutionV2PlatformProperty smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2PlatformProperty -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2PlatformProperty -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2PlatformProperty Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2PlatformProperty = D1 (MetaData "BuildBazelRemoteExecutionV2PlatformProperty" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2PlatformProperty'" PrefixI True) (S1 (MetaSel (Just "_bbrevppValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevppName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

buildBazelRemoteExecutionV2PlatformProperty :: BuildBazelRemoteExecutionV2PlatformProperty Source #

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

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

BuildBazelRemoteExecutionV2WaitExecutionRequest

data BuildBazelRemoteExecutionV2WaitExecutionRequest Source #

A request message for WaitExecution.

See: buildBazelRemoteExecutionV2WaitExecutionRequest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: BuildBazelRemoteExecutionV2WaitExecutionRequest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2WaitExecutionRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2WaitExecutionRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2WaitExecutionRequest = D1 (MetaData "BuildBazelRemoteExecutionV2WaitExecutionRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2WaitExecutionRequest'" PrefixI False) (U1 :: Type -> Type))

GoogleDevtoolsRemoteworkersV1test2CommandOutputs

data GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source #

DEPRECATED - use CommandResult instead. Describes the actual outputs from the task.

See: googleDevtoolsRemoteworkersV1test2CommandOutputs smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

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

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

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandOutputs -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandOutputs -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandOutputs = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandOutputs" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandOutputs'" PrefixI True) (S1 (MetaSel (Just "_gdrvcoOutputs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2Digest)) :*: S1 (MetaSel (Just "_gdrvcoExitCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

googleDevtoolsRemoteworkersV1test2CommandOutputs :: GoogleDevtoolsRemoteworkersV1test2CommandOutputs Source #

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

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

gdrvcoOutputs :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandOutputs (Maybe GoogleDevtoolsRemoteworkersV1test2Digest) Source #

The output files. The blob referenced by the digest should contain one of the following (implementation-dependent): * A marshalled DirectoryMetadata of the returned filesystem * A LUCI-style .isolated file

gdrvcoExitCode :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandOutputs (Maybe Int32) Source #

exit_code is only fully reliable if the status' code is OK. If the task exceeded its deadline or was cancelled, the process may still produce an exit code as it is cancelled, and this will be populated, but a successful (zero) is unlikely to be correct unless the status code is OK.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source #

Output only. State of the worker pool.

Constructors

GDRAVWPSStateUnspecified

STATE_UNSPECIFIED Not a valid state, but the default value of the enum.

GDRAVWPSCreating

CREATING The worker pool is in state `CREATING` once `CreateWorkerPool` is called and before all requested workers are ready.

GDRAVWPSRunning

RUNNING The worker pool is in state `RUNNING` when all its workers are ready for use.

GDRAVWPSUpdating

UPDATING The worker pool is in state `UPDATING` once `UpdateWorkerPool` is called and before the new configuration has all the requested workers ready for use, and no older configuration has any workers. At that point the state transitions to `RUNNING`.

GDRAVWPSDeleting

DELETING The worker pool is in state `DELETING` once the `Delete` method is called and before the deletion completes.

GDRAVWPSInactive

INACTIVE The worker pool is in state `INACTIVE` when the instance hosting the worker pool in not running.

Instances
Enum GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

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

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

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerPoolState" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) ((C1 (MetaCons "GDRAVWPSStateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GDRAVWPSCreating" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDRAVWPSRunning" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "GDRAVWPSUpdating" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GDRAVWPSDeleting" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDRAVWPSInactive" PrefixI False) (U1 :: Type -> Type))))

BuildBazelRemoteExecutionV2ExecutedActionMetadata

data BuildBazelRemoteExecutionV2ExecutedActionMetadata Source #

ExecutedActionMetadata contains details about a completed execution.

See: buildBazelRemoteExecutionV2ExecutedActionMetadata smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> c BuildBazelRemoteExecutionV2ExecutedActionMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ExecutedActionMetadata #

toConstr :: BuildBazelRemoteExecutionV2ExecutedActionMetadata -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecutedActionMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ExecutedActionMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ExecutedActionMetadata) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> BuildBazelRemoteExecutionV2ExecutedActionMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> m BuildBazelRemoteExecutionV2ExecutedActionMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> m BuildBazelRemoteExecutionV2ExecutedActionMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecutedActionMetadata -> m BuildBazelRemoteExecutionV2ExecutedActionMetadata #

Show BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecutedActionMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecutedActionMetadata = D1 (MetaData "BuildBazelRemoteExecutionV2ExecutedActionMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecutedActionMetadata'" PrefixI True) (((S1 (MetaSel (Just "_bbreveamOutputUploadCompletedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_bbreveamOutputUploadStartTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) :*: (S1 (MetaSel (Just "_bbreveamWorkerCompletedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: (S1 (MetaSel (Just "_bbreveamWorkerStartTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_bbreveamExecutionStartTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))) :*: ((S1 (MetaSel (Just "_bbreveamInputFetchStartTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_bbreveamQueuedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) :*: (S1 (MetaSel (Just "_bbreveamWorker") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bbreveamExecutionCompletedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_bbreveamInputFetchCompletedTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))))))

bbreveamWorkerCompletedTimestamp :: Lens' BuildBazelRemoteExecutionV2ExecutedActionMetadata (Maybe UTCTime) Source #

When the worker completed the action, including all stages.

bbreveamWorker :: Lens' BuildBazelRemoteExecutionV2ExecutedActionMetadata (Maybe Text) Source #

The name of the worker which ran the execution.

GoogleDevtoolsRemoteworkersV1test2Blob

data GoogleDevtoolsRemoteworkersV1test2Blob Source #

Describes a blob of binary content with its digest.

See: googleDevtoolsRemoteworkersV1test2Blob smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteworkersV1test2Blob -> c GoogleDevtoolsRemoteworkersV1test2Blob #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteworkersV1test2Blob #

toConstr :: GoogleDevtoolsRemoteworkersV1test2Blob -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2Blob -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2Blob) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2Blob) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteworkersV1test2Blob -> GoogleDevtoolsRemoteworkersV1test2Blob #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2Blob -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2Blob -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2Blob -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2Blob -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2Blob -> m GoogleDevtoolsRemoteworkersV1test2Blob #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2Blob -> m GoogleDevtoolsRemoteworkersV1test2Blob #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2Blob -> m GoogleDevtoolsRemoteworkersV1test2Blob #

Show GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2Blob Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2Blob = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2Blob" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2Blob'" PrefixI True) (S1 (MetaSel (Just "_gdrvbContents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdrvbDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2Digest))))

googleDevtoolsRemoteworkersV1test2Blob :: GoogleDevtoolsRemoteworkersV1test2Blob Source #

Creates a value of GoogleDevtoolsRemoteworkersV1test2Blob with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdrvbDigest :: Lens' GoogleDevtoolsRemoteworkersV1test2Blob (Maybe GoogleDevtoolsRemoteworkersV1test2Digest) Source #

The digest of the blob. This should be verified by the receiver.

BuildBazelRemoteExecutionV2FindMissingBlobsRequest

data BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source #

A request message for ContentAddressableStorage.FindMissingBlobs.

See: buildBazelRemoteExecutionV2FindMissingBlobsRequest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> c BuildBazelRemoteExecutionV2FindMissingBlobsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2FindMissingBlobsRequest #

toConstr :: BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2FindMissingBlobsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2FindMissingBlobsRequest) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> m BuildBazelRemoteExecutionV2FindMissingBlobsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> m BuildBazelRemoteExecutionV2FindMissingBlobsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2FindMissingBlobsRequest -> m BuildBazelRemoteExecutionV2FindMissingBlobsRequest #

Show BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2FindMissingBlobsRequest = D1 (MetaData "BuildBazelRemoteExecutionV2FindMissingBlobsRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2FindMissingBlobsRequest'" PrefixI True) (S1 (MetaSel (Just "_bbrevfmbrBlobDigests") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2Digest]))))

buildBazelRemoteExecutionV2FindMissingBlobsRequest :: BuildBazelRemoteExecutionV2FindMissingBlobsRequest Source #

Creates a value of BuildBazelRemoteExecutionV2FindMissingBlobsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs

data GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source #

An optional list of additional log outputs the server wishes to provide. A server can use this to return execution-specific logs however it wishes. This is intended primarily to make it easier for users to debug issues that may be outside of the actual job execution, such as by identifying the worker executing the action or by providing logs from the worker's setup phase. The keys SHOULD be human readable so that a client can display them to a user.

See: googleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> c GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs #

toConstr :: GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> m GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> m GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs -> m GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs #

Show GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testExecuteResponseServerLogs'" PrefixI True) (S1 (MetaSel (Just "_gdrverslAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text GoogleDevtoolsRemoteexecutionV1testLogFile))))

BuildBazelRemoteExecutionV2GetTreeResponse

data BuildBazelRemoteExecutionV2GetTreeResponse Source #

A response message for ContentAddressableStorage.GetTree.

See: buildBazelRemoteExecutionV2GetTreeResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2GetTreeResponse -> c BuildBazelRemoteExecutionV2GetTreeResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2GetTreeResponse #

toConstr :: BuildBazelRemoteExecutionV2GetTreeResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2GetTreeResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2GetTreeResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2GetTreeResponse) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2GetTreeResponse -> BuildBazelRemoteExecutionV2GetTreeResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2GetTreeResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2GetTreeResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2GetTreeResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2GetTreeResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2GetTreeResponse -> m BuildBazelRemoteExecutionV2GetTreeResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2GetTreeResponse -> m BuildBazelRemoteExecutionV2GetTreeResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2GetTreeResponse -> m BuildBazelRemoteExecutionV2GetTreeResponse #

Show BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2GetTreeResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2GetTreeResponse = D1 (MetaData "BuildBazelRemoteExecutionV2GetTreeResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2GetTreeResponse'" PrefixI True) (S1 (MetaSel (Just "_bbrevgtrDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2Directory])) :*: S1 (MetaSel (Just "_bbrevgtrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

buildBazelRemoteExecutionV2GetTreeResponse :: BuildBazelRemoteExecutionV2GetTreeResponse Source #

Creates a value of BuildBazelRemoteExecutionV2GetTreeResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bbrevgtrNextPageToken :: Lens' BuildBazelRemoteExecutionV2GetTreeResponse (Maybe Text) Source #

If present, signifies that there are more results which the client can retrieve by passing this as the page_token in a subsequent request. If empty, signifies that this is the last page of results.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source #

The request used for `GetInstance`.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest #

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest #

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravgirName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

googleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest Source #

Creates a value of GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdravgirName :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaGetInstanceRequest (Maybe Text) Source #

Name of the instance to retrieve. Format: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]`.

BuildBazelRemoteExecutionV2ResultsCachePolicy

data BuildBazelRemoteExecutionV2ResultsCachePolicy Source #

A `ResultsCachePolicy` is used for fine-grained control over how action outputs are stored in the CAS and Action Cache.

See: buildBazelRemoteExecutionV2ResultsCachePolicy smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> c BuildBazelRemoteExecutionV2ResultsCachePolicy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ResultsCachePolicy #

toConstr :: BuildBazelRemoteExecutionV2ResultsCachePolicy -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ResultsCachePolicy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ResultsCachePolicy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ResultsCachePolicy) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> BuildBazelRemoteExecutionV2ResultsCachePolicy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> m BuildBazelRemoteExecutionV2ResultsCachePolicy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> m BuildBazelRemoteExecutionV2ResultsCachePolicy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ResultsCachePolicy -> m BuildBazelRemoteExecutionV2ResultsCachePolicy #

Show BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ResultsCachePolicy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ResultsCachePolicy = D1 (MetaData "BuildBazelRemoteExecutionV2ResultsCachePolicy" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2ResultsCachePolicy'" PrefixI True) (S1 (MetaSel (Just "_bbrevrcpPriority") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

buildBazelRemoteExecutionV2ResultsCachePolicy :: BuildBazelRemoteExecutionV2ResultsCachePolicy Source #

Creates a value of BuildBazelRemoteExecutionV2ResultsCachePolicy with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bbrevrcpPriority :: Lens' BuildBazelRemoteExecutionV2ResultsCachePolicy (Maybe Int32) Source #

The priority (relative importance) of this content in the overall cache. Generally, a lower value means a longer retention time or other advantage, but the interpretation of a given value is server-dependent. A priority of 0 means a *default* value, decided by the server. The particular semantics of this field is up to the server. In particular, every server will have their own supported range of priorities, and will decide how these map into retention/eviction policy.

BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse

data BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source #

A response corresponding to a single blob that the client tried to upload.

See: buildBazelRemoteExecutionV2BatchReadBlobsResponseResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> c BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse #

toConstr :: BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> m BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> m BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse -> m BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse #

Show BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse = D1 (MetaData "BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse'" PrefixI True) (S1 (MetaSel (Just "_bbrevbrbrrStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleRpcStatus)) :*: (S1 (MetaSel (Just "_bbrevbrbrrData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_bbrevbrbrrDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)))))

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.RemoteBuildExecution.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

(==) :: Xgafv -> Xgafv -> Bool #

(/=) :: Xgafv -> Xgafv -> Bool #

Data Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.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.RemoteBuildExecution.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.RemoteBuildExecution.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.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.RemoteBuildExecution.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

BuildBazelRemoteExecutionV2ExecuteRequest

data BuildBazelRemoteExecutionV2ExecuteRequest Source #

A request message for Execution.Execute.

See: buildBazelRemoteExecutionV2ExecuteRequest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ExecuteRequest -> c BuildBazelRemoteExecutionV2ExecuteRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ExecuteRequest #

toConstr :: BuildBazelRemoteExecutionV2ExecuteRequest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecuteRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteRequest) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ExecuteRequest -> BuildBazelRemoteExecutionV2ExecuteRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteRequest -> m BuildBazelRemoteExecutionV2ExecuteRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteRequest -> m BuildBazelRemoteExecutionV2ExecuteRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteRequest -> m BuildBazelRemoteExecutionV2ExecuteRequest #

Show BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteRequest = D1 (MetaData "BuildBazelRemoteExecutionV2ExecuteRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecuteRequest'" PrefixI True) ((S1 (MetaSel (Just "_bbreverExecutionPolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ExecutionPolicy)) :*: S1 (MetaSel (Just "_bbreverSkipCacheLookup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_bbreverResultsCachePolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ResultsCachePolicy)) :*: S1 (MetaSel (Just "_bbreverActionDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)))))

bbreverExecutionPolicy :: Lens' BuildBazelRemoteExecutionV2ExecuteRequest (Maybe BuildBazelRemoteExecutionV2ExecutionPolicy) Source #

An optional policy for execution of the action. The server will have a default policy if this is not provided.

bbreverSkipCacheLookup :: Lens' BuildBazelRemoteExecutionV2ExecuteRequest (Maybe Bool) Source #

If true, the action will be executed anew even if its result was already present in the cache. If false, the result may be served from the ActionCache.

bbreverResultsCachePolicy :: Lens' BuildBazelRemoteExecutionV2ExecuteRequest (Maybe BuildBazelRemoteExecutionV2ResultsCachePolicy) Source #

An optional policy for the results of this execution in the remote cache. The server will have a default policy if this is not provided. This may be applied to both the ActionResult and the associated blobs.

BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse

data BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source #

A response message for ContentAddressableStorage.BatchUpdateBlobs.

See: buildBazelRemoteExecutionV2BatchUpdateBlobsResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse #

toConstr :: BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse #

Show BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse = D1 (MetaData "BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse'" PrefixI True) (S1 (MetaSel (Just "_bbrevbubrResponses") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse]))))

buildBazelRemoteExecutionV2BatchUpdateBlobsResponse :: BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse Source #

Creates a value of BuildBazelRemoteExecutionV2BatchUpdateBlobsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

BuildBazelRemoteExecutionV2ExecuteResponseServerLogs

data BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source #

An optional list of additional log outputs the server wishes to provide. A server can use this to return execution-specific logs however it wishes. This is intended primarily to make it easier for users to debug issues that may be outside of the actual job execution, such as by identifying the worker executing the action or by providing logs from the worker's setup phase. The keys SHOULD be human readable so that a client can display them to a user.

See: buildBazelRemoteExecutionV2ExecuteResponseServerLogs smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> c BuildBazelRemoteExecutionV2ExecuteResponseServerLogs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ExecuteResponseServerLogs #

toConstr :: BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteResponseServerLogs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteResponseServerLogs) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> m BuildBazelRemoteExecutionV2ExecuteResponseServerLogs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> m BuildBazelRemoteExecutionV2ExecuteResponseServerLogs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteResponseServerLogs -> m BuildBazelRemoteExecutionV2ExecuteResponseServerLogs #

Show BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteResponseServerLogs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteResponseServerLogs = D1 (MetaData "BuildBazelRemoteExecutionV2ExecuteResponseServerLogs" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecuteResponseServerLogs'" PrefixI True) (S1 (MetaSel (Just "_bbreverslAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text BuildBazelRemoteExecutionV2LogFile))))

BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction

data BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source #

Remote execution may only support a single digest function.

Instances
Enum BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> c BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction #

toConstr :: BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> m BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> m BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction -> m BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction #

Ord BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction = D1 (MetaData "BuildBazelRemoteExecutionV2ExecutionCapabilitiesDigestFunction" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) ((C1 (MetaCons "BBREVECDFUnknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BBREVECDFSHA256" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BBREVECDFSHA1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BBREVECDFMD5" PrefixI False) (U1 :: Type -> Type)))

GoogleLongrunningOperationResponse

data GoogleLongrunningOperationResponse 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: googleLongrunningOperationResponse smart constructor.

Instances
Eq GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleLongrunningOperationResponse -> c GoogleLongrunningOperationResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleLongrunningOperationResponse #

toConstr :: GoogleLongrunningOperationResponse -> Constr #

dataTypeOf :: GoogleLongrunningOperationResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleLongrunningOperationResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleLongrunningOperationResponse) #

gmapT :: (forall b. Data b => b -> b) -> GoogleLongrunningOperationResponse -> GoogleLongrunningOperationResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleLongrunningOperationResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleLongrunningOperationResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleLongrunningOperationResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleLongrunningOperationResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleLongrunningOperationResponse -> m GoogleLongrunningOperationResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleLongrunningOperationResponse -> m GoogleLongrunningOperationResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleLongrunningOperationResponse -> m GoogleLongrunningOperationResponse #

Show GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep GoogleLongrunningOperationResponse :: Type -> Type #

ToJSON GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleLongrunningOperationResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleLongrunningOperationResponse = D1 (MetaData "GoogleLongrunningOperationResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleLongrunningOperationResponse'" PrefixI True) (S1 (MetaSel (Just "_glorAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

googleLongrunningOperationResponse Source #

Creates a value of GoogleLongrunningOperationResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

glorAddtional :: Lens' GoogleLongrunningOperationResponse (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

BuildBazelRemoteExecutionV2FileNode

data BuildBazelRemoteExecutionV2FileNode Source #

A `FileNode` represents a single file and associated metadata.

See: buildBazelRemoteExecutionV2FileNode smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2FileNode -> c BuildBazelRemoteExecutionV2FileNode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2FileNode #

toConstr :: BuildBazelRemoteExecutionV2FileNode -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2FileNode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2FileNode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2FileNode) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2FileNode -> BuildBazelRemoteExecutionV2FileNode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2FileNode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2FileNode -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2FileNode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2FileNode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2FileNode -> m BuildBazelRemoteExecutionV2FileNode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2FileNode -> m BuildBazelRemoteExecutionV2FileNode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2FileNode -> m BuildBazelRemoteExecutionV2FileNode #

Show BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2FileNode Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2FileNode = D1 (MetaData "BuildBazelRemoteExecutionV2FileNode" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2FileNode'" PrefixI True) (S1 (MetaSel (Just "_bbrevfnName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bbrevfnIsExecutable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bbrevfnDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)))))

buildBazelRemoteExecutionV2FileNode :: BuildBazelRemoteExecutionV2FileNode Source #

Creates a value of BuildBazelRemoteExecutionV2FileNode with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bbrevfnIsExecutable :: Lens' BuildBazelRemoteExecutionV2FileNode (Maybe Bool) Source #

True if file is executable, false otherwise.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source #

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse #

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse #

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesResponse'" PrefixI True) (S1 (MetaSel (Just "_gdravlirInstances") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [GoogleDevtoolsRemotebuildexecutionAdminV1alphaInstance]))))

GoogleDevtoolsRemoteworkersV1test2CommandTask

data GoogleDevtoolsRemoteworkersV1test2CommandTask Source #

Describes a shell-style task to execute, suitable for providing as the Bots interface's `Lease.payload` field.

See: googleDevtoolsRemoteworkersV1test2CommandTask smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> c GoogleDevtoolsRemoteworkersV1test2CommandTask #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteworkersV1test2CommandTask #

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandTask -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandTask -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2CommandTask) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2CommandTask) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> GoogleDevtoolsRemoteworkersV1test2CommandTask #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> m GoogleDevtoolsRemoteworkersV1test2CommandTask #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> m GoogleDevtoolsRemoteworkersV1test2CommandTask #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTask -> m GoogleDevtoolsRemoteworkersV1test2CommandTask #

Show GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTask Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTask = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandTask" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandTask'" PrefixI True) (S1 (MetaSel (Just "_gdrvctInputs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs)) :*: (S1 (MetaSel (Just "_gdrvctExpectedOutputs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs)) :*: S1 (MetaSel (Just "_gdrvctTimeouts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteworkersV1test2CommandTaskTimeouts)))))

googleDevtoolsRemoteworkersV1test2CommandTask :: GoogleDevtoolsRemoteworkersV1test2CommandTask Source #

Creates a value of GoogleDevtoolsRemoteworkersV1test2CommandTask with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

GoogleDevtoolsRemoteexecutionV1testCommand

data GoogleDevtoolsRemoteexecutionV1testCommand Source #

A `Command` is the actual command executed by a worker running an Action. Except as otherwise required, the environment (such as which system libraries or binaries are available, and what filesystems are mounted where) is defined by and specific to the implementation of the remote execution API.

See: googleDevtoolsRemoteexecutionV1testCommand smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteexecutionV1testCommand -> c GoogleDevtoolsRemoteexecutionV1testCommand #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteexecutionV1testCommand #

toConstr :: GoogleDevtoolsRemoteexecutionV1testCommand -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testCommand -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testCommand) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testCommand) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteexecutionV1testCommand -> GoogleDevtoolsRemoteexecutionV1testCommand #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testCommand -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testCommand -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testCommand -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testCommand -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testCommand -> m GoogleDevtoolsRemoteexecutionV1testCommand #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testCommand -> m GoogleDevtoolsRemoteexecutionV1testCommand #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testCommand -> m GoogleDevtoolsRemoteexecutionV1testCommand #

Show GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testCommand = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testCommand" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testCommand'" PrefixI True) (S1 (MetaSel (Just "_gdrvcArguments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_gdrvcEnvironmentVariables") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable]))))

googleDevtoolsRemoteexecutionV1testCommand :: GoogleDevtoolsRemoteexecutionV1testCommand Source #

Creates a value of GoogleDevtoolsRemoteexecutionV1testCommand with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdrvcArguments :: Lens' GoogleDevtoolsRemoteexecutionV1testCommand [Text] Source #

The arguments to the command. The first argument must be the path to the executable, which must be either a relative path, in which case it is evaluated with respect to the input root, or an absolute path. The working directory will always be the input root.

gdrvcEnvironmentVariables :: Lens' GoogleDevtoolsRemoteexecutionV1testCommand [GoogleDevtoolsRemoteexecutionV1testCommandEnvironmentVariable] Source #

The environment variables to set when running the program. The worker may provide its own default environment variables; these defaults can be overridden using this field. Additional variables can also be specified. In order to ensure that equivalent `Command`s always hash to the same value, the environment variables MUST be lexicographically sorted by name. Sorting of strings is done by code point, equivalently, by the UTF-8 bytes.

GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata

data GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source #

Metadata about an ongoing execution, which will be contained in the metadata field of the Operation.

See: googleDevtoolsRemoteexecutionV1testExecuteOperationMetadata smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> c GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata #

toConstr :: GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> m GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> m GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata -> m GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata #

Show GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata'" PrefixI True) ((S1 (MetaSel (Just "_gdrveomStage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadataStage)) :*: S1 (MetaSel (Just "_gdrveomStderrStreamName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdrveomStdoutStreamName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdrveomActionDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest)))))

gdrveomStderrStreamName :: Lens' GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata (Maybe Text) Source #

If set, the client can use this name with ByteStream.Read to stream the standard error.

gdrveomStdoutStreamName :: Lens' GoogleDevtoolsRemoteexecutionV1testExecuteOperationMetadata (Maybe Text) Source #

If set, the client can use this name with ByteStream.Read to stream the standard output.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source #

Defines the configuration to be used for a creating workers in the worker pool.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig #

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig #

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig'" PrefixI True) ((S1 (MetaSel (Just "_gdravwcDiskSizeGb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gdravwcReserved") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_gdravwcMachineType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdravwcDiskType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdravwcMinCPUPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

gdravwcDiskSizeGb :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig (Maybe Int64) Source #

Required. Size of the disk attached to the worker, in GB. See https://cloud.google.com/compute/docs/disks/

gdravwcReserved :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig (Maybe Bool) Source #

Output only. `reserved=true` means the worker is reserved and won't be preempted.

gdravwcMachineType :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig (Maybe Text) Source #

Required. Machine type of the worker, such as n1-standard-2. See https://cloud.google.com/compute/docs/machine-types for a list of supported machine types.

gdravwcDiskType :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaWorkerConfig (Maybe Text) Source #

Required. Disk Type to use for the worker. See Storage options. Currently only `pd-standard` is supported.

BuildBazelRemoteExecutionV2ExecuteResponse

data BuildBazelRemoteExecutionV2ExecuteResponse Source #

The response message for Execution.Execute, which will be contained in the response field of the Operation.

See: buildBazelRemoteExecutionV2ExecuteResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ExecuteResponse -> c BuildBazelRemoteExecutionV2ExecuteResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ExecuteResponse #

toConstr :: BuildBazelRemoteExecutionV2ExecuteResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecuteResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteResponse) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ExecuteResponse -> BuildBazelRemoteExecutionV2ExecuteResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteResponse -> m BuildBazelRemoteExecutionV2ExecuteResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteResponse -> m BuildBazelRemoteExecutionV2ExecuteResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteResponse -> m BuildBazelRemoteExecutionV2ExecuteResponse #

Show BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteResponse = D1 (MetaData "BuildBazelRemoteExecutionV2ExecuteResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecuteResponse'" PrefixI True) ((S1 (MetaSel (Just "_bbreverStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleRpcStatus)) :*: S1 (MetaSel (Just "_bbreverServerLogs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ExecuteResponseServerLogs))) :*: (S1 (MetaSel (Just "_bbreverResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ActionResult)) :*: S1 (MetaSel (Just "_bbreverCachedResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

buildBazelRemoteExecutionV2ExecuteResponse :: BuildBazelRemoteExecutionV2ExecuteResponse Source #

Creates a value of BuildBazelRemoteExecutionV2ExecuteResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bbreverStatus :: Lens' BuildBazelRemoteExecutionV2ExecuteResponse (Maybe GoogleRpcStatus) Source #

If the status has a code other than `OK`, it indicates that the action did not finish execution. For example, if the operation times out during execution, the status will have a `DEADLINE_EXCEEDED` code. Servers MUST use this field for errors in execution, rather than the error field on the `Operation` object. If the status code is other than `OK`, then the result MUST NOT be cached. For an error status, the `result` field is optional; the server may populate the output-, stdout-, and stderr-related fields if it has any information available, such as the stdout and stderr of a timed-out action.

bbreverServerLogs :: Lens' BuildBazelRemoteExecutionV2ExecuteResponse (Maybe BuildBazelRemoteExecutionV2ExecuteResponseServerLogs) Source #

An optional list of additional log outputs the server wishes to provide. A server can use this to return execution-specific logs however it wishes. This is intended primarily to make it easier for users to debug issues that may be outside of the actual job execution, such as by identifying the worker executing the action or by providing logs from the worker's setup phase. The keys SHOULD be human readable so that a client can display them to a user.

bbreverCachedResult :: Lens' BuildBazelRemoteExecutionV2ExecuteResponse (Maybe Bool) Source #

True if the result was served from cache, false if it was executed.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source #

The request used for `DeleteInstance`.

See: googleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest #

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest #

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravdirName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

gdravdirName :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaDeleteInstanceRequest (Maybe Text) Source #

Name of the instance to delete. Format: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]`.

BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy

data BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source #

Whether absolute symlink targets are supported.

Constructors

BBREVCCSAPSUnknown
UNKNOWN
BBREVCCSAPSDisallowed

DISALLOWED Server will return an INVALID_ARGUMENT on input symlinks with absolute targets. If an action tries to create an output symlink with an absolute target, a FAILED_PRECONDITION will be returned.

BBREVCCSAPSAllowed

ALLOWED Server will allow symlink targets to escape the input root tree, possibly resulting in non-hermetic builds.

Instances
Enum BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> c BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy #

toConstr :: BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> m BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> m BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy -> m BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy #

Ord BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy = D1 (MetaData "BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BBREVCCSAPSUnknown" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BBREVCCSAPSDisallowed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BBREVCCSAPSAllowed" PrefixI False) (U1 :: Type -> Type)))

GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs

data GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source #

Describes the inputs to a shell-style task.

See: googleDevtoolsRemoteworkersV1test2CommandTaskInputs smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> c GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs #

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> m GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> m GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs -> m GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs #

Show GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs'" PrefixI True) ((S1 (MetaSel (Just "_gdrvctiArguments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_gdrvctiFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteworkersV1test2Digest]))) :*: (S1 (MetaSel (Just "_gdrvctiEnvironmentVariables") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteworkersV1test2CommandTaskInputsEnvironmentVariable])) :*: S1 (MetaSel (Just "_gdrvctiInlineBlobs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GoogleDevtoolsRemoteworkersV1test2Blob])))))

gdrvctiArguments :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs [Text] Source #

The command itself to run (e.g., argv). This field should be passed directly to the underlying operating system, and so it must be sensible to that operating system. For example, on Windows, the first argument might be "C:\Windows\System32\ping.exe" - that is, using drive letters and backslashes. A command for a *nix system, on the other hand, would use forward slashes. All other fields in the RWAPI must consistently use forward slashes, since those fields may be interpretted by both the service and the bot.

gdrvctiFiles :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs [GoogleDevtoolsRemoteworkersV1test2Digest] Source #

The input filesystem to be set up prior to the task beginning. The contents should be a repeated set of FileMetadata messages though other formats are allowed if better for the implementation (eg, a LUCI-style .isolated file). This field is repeated since implementations might want to cache the metadata, in which case it may be useful to break up portions of the filesystem that change frequently (eg, specific input files) from those that don't (eg, standard header files).

gdrvctiInlineBlobs :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskInputs [GoogleDevtoolsRemoteworkersV1test2Blob] Source #

Inline contents for blobs expected to be needed by the bot to execute the task. For example, contents of entries in `files` or blobs that are indirectly referenced by an entry there. The bot should check against this list before downloading required task inputs to reduce the number of communications between itself and the remote CAS server.

BuildBazelRemoteExecutionV2CommandEnvironmentVariable

data BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source #

An `EnvironmentVariable` is one variable to set in the running program's environment.

See: buildBazelRemoteExecutionV2CommandEnvironmentVariable smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> c BuildBazelRemoteExecutionV2CommandEnvironmentVariable #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2CommandEnvironmentVariable #

toConstr :: BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2CommandEnvironmentVariable) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2CommandEnvironmentVariable) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> m BuildBazelRemoteExecutionV2CommandEnvironmentVariable #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> m BuildBazelRemoteExecutionV2CommandEnvironmentVariable #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CommandEnvironmentVariable -> m BuildBazelRemoteExecutionV2CommandEnvironmentVariable #

Show BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2CommandEnvironmentVariable = D1 (MetaData "BuildBazelRemoteExecutionV2CommandEnvironmentVariable" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2CommandEnvironmentVariable'" PrefixI True) (S1 (MetaSel (Just "_bbrevcevValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevcevName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

buildBazelRemoteExecutionV2CommandEnvironmentVariable :: BuildBazelRemoteExecutionV2CommandEnvironmentVariable Source #

Creates a value of BuildBazelRemoteExecutionV2CommandEnvironmentVariable with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source #

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest #

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest #

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravlirParent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

gdravlirParent :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaListInstancesRequest (Maybe Text) Source #

Resource name of the project. Format: `projects/[PROJECT_ID]`.

BuildBazelRemoteExecutionV2PriorityCapabilities

data BuildBazelRemoteExecutionV2PriorityCapabilities Source #

Allowed values for priority in ResultsCachePolicy Used for querying both cache and execution valid priority ranges.

See: buildBazelRemoteExecutionV2PriorityCapabilities smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> c BuildBazelRemoteExecutionV2PriorityCapabilities #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2PriorityCapabilities #

toConstr :: BuildBazelRemoteExecutionV2PriorityCapabilities -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2PriorityCapabilities -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2PriorityCapabilities) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2PriorityCapabilities) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> BuildBazelRemoteExecutionV2PriorityCapabilities #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2PriorityCapabilities -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2PriorityCapabilities -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> m BuildBazelRemoteExecutionV2PriorityCapabilities #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> m BuildBazelRemoteExecutionV2PriorityCapabilities #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2PriorityCapabilities -> m BuildBazelRemoteExecutionV2PriorityCapabilities #

Show BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2PriorityCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2PriorityCapabilities = D1 (MetaData "BuildBazelRemoteExecutionV2PriorityCapabilities" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2PriorityCapabilities'" PrefixI True) (S1 (MetaSel (Just "_bbrevpcPriorities") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2PriorityCapabilitiesPriorityRange]))))

buildBazelRemoteExecutionV2PriorityCapabilities :: BuildBazelRemoteExecutionV2PriorityCapabilities Source #

Creates a value of BuildBazelRemoteExecutionV2PriorityCapabilities with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest

data BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source #

A request message for ContentAddressableStorage.BatchUpdateBlobs.

See: buildBazelRemoteExecutionV2BatchUpdateBlobsRequest smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> c BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest #

toConstr :: BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest #

Show BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest = D1 (MetaData "BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest'" PrefixI True) (S1 (MetaSel (Just "_bbrevbubrRequests") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2BatchUpdateBlobsRequestRequest]))))

buildBazelRemoteExecutionV2BatchUpdateBlobsRequest :: BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest Source #

Creates a value of BuildBazelRemoteExecutionV2BatchUpdateBlobsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

GoogleDevtoolsRemoteexecutionV1testLogFile

data GoogleDevtoolsRemoteexecutionV1testLogFile Source #

A `LogFile` is a log stored in the CAS.

See: googleDevtoolsRemoteexecutionV1testLogFile smart constructor.

Instances
Eq GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> c GoogleDevtoolsRemoteexecutionV1testLogFile #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteexecutionV1testLogFile #

toConstr :: GoogleDevtoolsRemoteexecutionV1testLogFile -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteexecutionV1testLogFile -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testLogFile) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteexecutionV1testLogFile) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> GoogleDevtoolsRemoteexecutionV1testLogFile #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testLogFile -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteexecutionV1testLogFile -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> m GoogleDevtoolsRemoteexecutionV1testLogFile #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> m GoogleDevtoolsRemoteexecutionV1testLogFile #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteexecutionV1testLogFile -> m GoogleDevtoolsRemoteexecutionV1testLogFile #

Show GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testLogFile Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteexecutionV1testLogFile = D1 (MetaData "GoogleDevtoolsRemoteexecutionV1testLogFile" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteexecutionV1testLogFile'" PrefixI True) (S1 (MetaSel (Just "_gdrvlfHumanReadable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gdrvlfDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleDevtoolsRemoteexecutionV1testDigest))))

googleDevtoolsRemoteexecutionV1testLogFile :: GoogleDevtoolsRemoteexecutionV1testLogFile Source #

Creates a value of GoogleDevtoolsRemoteexecutionV1testLogFile with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdrvlfHumanReadable :: Lens' GoogleDevtoolsRemoteexecutionV1testLogFile (Maybe Bool) Source #

This is a hint as to the purpose of the log, and is set to true if the log is human-readable text that can be usefully displayed to a user, and false otherwise. For instance, if a command-line client wishes to print the server logs to the terminal for a failed action, this allows it to avoid displaying a binary file.

BuildBazelRemoteExecutionV2RequestMetadata

data BuildBazelRemoteExecutionV2RequestMetadata Source #

An optional Metadata to attach to any RPC request to tell the server about an external context of the request. The server may use this for logging or other purposes. To use it, the client attaches the header to the call using the canonical proto serialization: name: build.bazel.remote.execution.v2.requestmetadata-bin contents: the base64 encoded binary RequestMetadata message.

See: buildBazelRemoteExecutionV2RequestMetadata smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2RequestMetadata -> c BuildBazelRemoteExecutionV2RequestMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2RequestMetadata #

toConstr :: BuildBazelRemoteExecutionV2RequestMetadata -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2RequestMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2RequestMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2RequestMetadata) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2RequestMetadata -> BuildBazelRemoteExecutionV2RequestMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2RequestMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2RequestMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2RequestMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2RequestMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2RequestMetadata -> m BuildBazelRemoteExecutionV2RequestMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2RequestMetadata -> m BuildBazelRemoteExecutionV2RequestMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2RequestMetadata -> m BuildBazelRemoteExecutionV2RequestMetadata #

Show BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2RequestMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2RequestMetadata = D1 (MetaData "BuildBazelRemoteExecutionV2RequestMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2RequestMetadata'" PrefixI True) ((S1 (MetaSel (Just "_bbrevrmCorrelatedInvocationsId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevrmToolInvocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_bbrevrmActionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevrmToolDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ToolDetails)))))

bbrevrmCorrelatedInvocationsId :: Lens' BuildBazelRemoteExecutionV2RequestMetadata (Maybe Text) Source #

An identifier to tie multiple tool invocations together. For example, runs of foo_test, bar_test and baz_test on a post-submit of a given patch.

bbrevrmToolInvocationId :: Lens' BuildBazelRemoteExecutionV2RequestMetadata (Maybe Text) Source #

An identifier that ties multiple actions together to a final result. For example, multiple actions are required to build and run foo_test.

bbrevrmActionId :: Lens' BuildBazelRemoteExecutionV2RequestMetadata (Maybe Text) Source #

An identifier that ties multiple requests to the same action. For example, multiple requests to the CAS, Action Cache, and Execution API are used in order to compile foo.cc.

BuildBazelRemoteExecutionV2Platform

data BuildBazelRemoteExecutionV2Platform Source #

A `Platform` is a set of requirements, such as hardware, operating system, or compiler toolchain, for an Action's execution environment. A `Platform` is represented as a series of key-value pairs representing the properties that are required of the platform.

See: buildBazelRemoteExecutionV2Platform smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2Platform -> c BuildBazelRemoteExecutionV2Platform #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2Platform #

toConstr :: BuildBazelRemoteExecutionV2Platform -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2Platform -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2Platform) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2Platform) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2Platform -> BuildBazelRemoteExecutionV2Platform #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2Platform -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2Platform -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2Platform -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2Platform -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2Platform -> m BuildBazelRemoteExecutionV2Platform #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2Platform -> m BuildBazelRemoteExecutionV2Platform #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2Platform -> m BuildBazelRemoteExecutionV2Platform #

Show BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Platform Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Platform = D1 (MetaData "BuildBazelRemoteExecutionV2Platform" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2Platform'" PrefixI True) (S1 (MetaSel (Just "_bbrevpProperties") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2PlatformProperty]))))

buildBazelRemoteExecutionV2Platform :: BuildBazelRemoteExecutionV2Platform Source #

Creates a value of BuildBazelRemoteExecutionV2Platform with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bbrevpProperties :: Lens' BuildBazelRemoteExecutionV2Platform [BuildBazelRemoteExecutionV2PlatformProperty] Source #

The properties that make up this platform. In order to ensure that equivalent `Platform`s always hash to the same value, the properties MUST be lexicographically sorted by name, and then by value. Sorting of strings is done by code point, equivalently, by the UTF-8 bytes.

GoogleDevtoolsRemoteworkersV1test2AdminTempCommand

data GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source #

The admin action; see `Command` for legal values.

Constructors

Unspecified

UNSPECIFIED Illegal value.

BotUpdate

BOT_UPDATE Download and run a new version of the bot. `arg` will be a resource accessible via `ByteStream.Read` to obtain the new bot code.

BotRestart

BOT_RESTART Restart the bot without downloading a new version. `arg` will be a message to log.

BotTerminate

BOT_TERMINATE Shut down the bot. `arg` will be a task resource name (similar to those in tasks.proto) that the bot can use to tell the server that it is terminating.

HostRestart

HOST_RESTART Restart the host computer. `arg` will be a message to log.

Instances
Enum GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Eq GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Data GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> c GoogleDevtoolsRemoteworkersV1test2AdminTempCommand #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteworkersV1test2AdminTempCommand #

toConstr :: GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2AdminTempCommand) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2AdminTempCommand) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> m GoogleDevtoolsRemoteworkersV1test2AdminTempCommand #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> m GoogleDevtoolsRemoteworkersV1test2AdminTempCommand #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2AdminTempCommand -> m GoogleDevtoolsRemoteworkersV1test2AdminTempCommand #

Ord GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Read GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Show GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Generic GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

Hashable GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToJSON GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromJSON GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

FromHttpApiData GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

ToHttpApiData GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemoteworkersV1test2AdminTempCommand Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Sum

type Rep GoogleDevtoolsRemoteworkersV1test2AdminTempCommand = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2AdminTempCommand" "Network.Google.RemoteBuildExecution.Types.Sum" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) ((C1 (MetaCons "Unspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BotUpdate" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BotRestart" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BotTerminate" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "HostRestart" PrefixI False) (U1 :: Type -> Type))))

BuildBazelRemoteExecutionV2ExecuteOperationMetadata

data BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source #

Metadata about an ongoing execution, which will be contained in the metadata field of the Operation.

See: buildBazelRemoteExecutionV2ExecuteOperationMetadata smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> c BuildBazelRemoteExecutionV2ExecuteOperationMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ExecuteOperationMetadata #

toConstr :: BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteOperationMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ExecuteOperationMetadata) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> m BuildBazelRemoteExecutionV2ExecuteOperationMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> m BuildBazelRemoteExecutionV2ExecuteOperationMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ExecuteOperationMetadata -> m BuildBazelRemoteExecutionV2ExecuteOperationMetadata #

Show BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteOperationMetadata Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ExecuteOperationMetadata = D1 (MetaData "BuildBazelRemoteExecutionV2ExecuteOperationMetadata" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ExecuteOperationMetadata'" PrefixI True) ((S1 (MetaSel (Just "_bbreveomStage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ExecuteOperationMetadataStage)) :*: S1 (MetaSel (Just "_bbreveomStderrStreamName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_bbreveomStdoutStreamName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbreveomActionDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest)))))

bbreveomStderrStreamName :: Lens' BuildBazelRemoteExecutionV2ExecuteOperationMetadata (Maybe Text) Source #

If set, the client can use this name with ByteStream.Read to stream the standard error.

bbreveomStdoutStreamName :: Lens' BuildBazelRemoteExecutionV2ExecuteOperationMetadata (Maybe Text) Source #

If set, the client can use this name with ByteStream.Read to stream the standard output.

GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest

data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source #

Instances
Eq GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest #

toConstr :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest -> m GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest #

Show GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest = D1 (MetaData "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest'" PrefixI True) (S1 (MetaSel (Just "_gdravlwprParent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

gdravlwprParent :: Lens' GoogleDevtoolsRemotebuildexecutionAdminV1alphaListWorkerPoolsRequest (Maybe Text) Source #

Resource name of the instance. Format: `projects/[PROJECT_ID]/instances/[INSTANCE_ID]`.

BuildBazelRemoteExecutionV2Command

data BuildBazelRemoteExecutionV2Command Source #

A `Command` is the actual command executed by a worker running an Action and specifications of its environment. Except as otherwise required, the environment (such as which system libraries or binaries are available, and what filesystems are mounted where) is defined by and specific to the implementation of the remote execution API.

See: buildBazelRemoteExecutionV2Command smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2Command -> c BuildBazelRemoteExecutionV2Command #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2Command #

toConstr :: BuildBazelRemoteExecutionV2Command -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2Command -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2Command) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2Command) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2Command -> BuildBazelRemoteExecutionV2Command #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2Command -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2Command -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2Command -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2Command -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2Command -> m BuildBazelRemoteExecutionV2Command #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2Command -> m BuildBazelRemoteExecutionV2Command #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2Command -> m BuildBazelRemoteExecutionV2Command #

Show BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep BuildBazelRemoteExecutionV2Command :: Type -> Type #

ToJSON BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Command Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2Command = D1 (MetaData "BuildBazelRemoteExecutionV2Command" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2Command'" PrefixI True) ((S1 (MetaSel (Just "_bbrevcPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Platform)) :*: (S1 (MetaSel (Just "_bbrevcOutputDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_bbrevcWorkingDirectory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_bbrevcArguments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_bbrevcOutputFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_bbrevcEnvironmentVariables") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildBazelRemoteExecutionV2CommandEnvironmentVariable]))))))

bbrevcPlatform :: Lens' BuildBazelRemoteExecutionV2Command (Maybe BuildBazelRemoteExecutionV2Platform) Source #

The platform requirements for the execution environment. The server MAY choose to execute the action on any worker satisfying the requirements, so the client SHOULD ensure that running the action on any such worker will have the same result.

bbrevcOutputDirectories :: Lens' BuildBazelRemoteExecutionV2Command [Text] Source #

A list of the output directories that the client expects to retrieve from the action. Only the contents of the indicated directories (recursively including the contents of their subdirectories) will be returned, as well as files listed in `output_files`. Other files that may be created during command execution are discarded. The paths are relative to the working directory of the action execution. The paths are specified using a single forward slash (`/`) as a path separator, even if the execution platform natively uses a different separator. The path MUST NOT include a trailing slash, nor a leading slash, being a relative path. The special value of empty string is allowed, although not recommended, and can be used to capture the entire working directory tree, including inputs. In order to ensure consistent hashing of the same Action, the output paths MUST be sorted lexicographically by code point (or, equivalently, by UTF-8 bytes). An output directory cannot be duplicated, be a parent of another output directory, be a parent of a listed output file, or have the same path as any of the listed output files.

bbrevcWorkingDirectory :: Lens' BuildBazelRemoteExecutionV2Command (Maybe Text) Source #

The working directory, relative to the input root, for the command to run in. It must be a directory which exists in the input tree. If it is left empty, then the action is run in the input root.

bbrevcArguments :: Lens' BuildBazelRemoteExecutionV2Command [Text] Source #

The arguments to the command. The first argument must be the path to the executable, which must be either a relative path, in which case it is evaluated with respect to the input root, or an absolute path.

bbrevcOutputFiles :: Lens' BuildBazelRemoteExecutionV2Command [Text] Source #

A list of the output files that the client expects to retrieve from the action. Only the listed files, as well as directories listed in `output_directories`, will be returned to the client as output. Other files that may be created during command execution are discarded. The paths are relative to the working directory of the action execution. The paths are specified using a single forward slash (`/`) as a path separator, even if the execution platform natively uses a different separator. The path MUST NOT include a trailing slash, nor a leading slash, being a relative path. In order to ensure consistent hashing of the same Action, the output paths MUST be sorted lexicographically by code point (or, equivalently, by UTF-8 bytes). An output file cannot be duplicated, be a parent of another output file, be a child of a listed output directory, or have the same path as any of the listed output directories.

bbrevcEnvironmentVariables :: Lens' BuildBazelRemoteExecutionV2Command [BuildBazelRemoteExecutionV2CommandEnvironmentVariable] Source #

The environment variables to set when running the program. The worker may provide its own default environment variables; these defaults can be overridden using this field. Additional variables can also be specified. In order to ensure that equivalent `Command`s always hash to the same value, the environment variables MUST be lexicographically sorted by name. Sorting of strings is done by code point, equivalently, by the UTF-8 bytes.

BuildBazelRemoteExecutionV2ToolDetails

data BuildBazelRemoteExecutionV2ToolDetails Source #

Details for the tool used to call the API.

See: buildBazelRemoteExecutionV2ToolDetails smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2ToolDetails -> c BuildBazelRemoteExecutionV2ToolDetails #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2ToolDetails #

toConstr :: BuildBazelRemoteExecutionV2ToolDetails -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2ToolDetails -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2ToolDetails) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2ToolDetails) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2ToolDetails -> BuildBazelRemoteExecutionV2ToolDetails #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ToolDetails -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2ToolDetails -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ToolDetails -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2ToolDetails -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ToolDetails -> m BuildBazelRemoteExecutionV2ToolDetails #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ToolDetails -> m BuildBazelRemoteExecutionV2ToolDetails #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2ToolDetails -> m BuildBazelRemoteExecutionV2ToolDetails #

Show BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ToolDetails Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2ToolDetails = D1 (MetaData "BuildBazelRemoteExecutionV2ToolDetails" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2ToolDetails'" PrefixI True) (S1 (MetaSel (Just "_bbrevtdToolName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bbrevtdToolVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

buildBazelRemoteExecutionV2ToolDetails :: BuildBazelRemoteExecutionV2ToolDetails Source #

Creates a value of BuildBazelRemoteExecutionV2ToolDetails with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bbrevtdToolVersion :: Lens' BuildBazelRemoteExecutionV2ToolDetails (Maybe Text) Source #

Version of the tool used for the request, e.g. 5.0.3.

BuildBazelRemoteExecutionV2CacheCapabilities

data BuildBazelRemoteExecutionV2CacheCapabilities Source #

Capabilities of the remote cache system.

See: buildBazelRemoteExecutionV2CacheCapabilities smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2CacheCapabilities -> c BuildBazelRemoteExecutionV2CacheCapabilities #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2CacheCapabilities #

toConstr :: BuildBazelRemoteExecutionV2CacheCapabilities -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2CacheCapabilities -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2CacheCapabilities) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2CacheCapabilities) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2CacheCapabilities -> BuildBazelRemoteExecutionV2CacheCapabilities #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2CacheCapabilities -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2CacheCapabilities -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2CacheCapabilities -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2CacheCapabilities -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CacheCapabilities -> m BuildBazelRemoteExecutionV2CacheCapabilities #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CacheCapabilities -> m BuildBazelRemoteExecutionV2CacheCapabilities #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2CacheCapabilities -> m BuildBazelRemoteExecutionV2CacheCapabilities #

Show BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2CacheCapabilities Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2CacheCapabilities = D1 (MetaData "BuildBazelRemoteExecutionV2CacheCapabilities" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2CacheCapabilities'" PrefixI True) ((S1 (MetaSel (Just "_bbrevccSymlinkAbsolutePathStrategy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2CacheCapabilitiesSymlinkAbsolutePathStrategy)) :*: S1 (MetaSel (Just "_bbrevccMaxBatchTotalSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_bbrevccDigestFunction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_bbrevccActionCacheUpdateCapabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2ActionCacheUpdateCapabilities)) :*: S1 (MetaSel (Just "_bbrevccCachePriorityCapabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2PriorityCapabilities))))))

bbrevccMaxBatchTotalSizeBytes :: Lens' BuildBazelRemoteExecutionV2CacheCapabilities (Maybe Int64) Source #

Maximum total size of blobs to be uploaded/downloaded using batch methods. A value of 0 means no limit is set, although in practice there will always be a message size limitation of the protocol in use, e.g. GRPC.

bbrevccDigestFunction :: Lens' BuildBazelRemoteExecutionV2CacheCapabilities [Text] Source #

All the digest functions supported by the remote cache. Remote cache may support multiple digest functions simultaneously.

GoogleDevtoolsRemotebuildbotCommandEvents

data GoogleDevtoolsRemotebuildbotCommandEvents Source #

CommandEvents contains counters for the number of warnings and errors that occurred during the execution of a command.

See: googleDevtoolsRemotebuildbotCommandEvents smart constructor.

Instances
Eq GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemotebuildbotCommandEvents -> c GoogleDevtoolsRemotebuildbotCommandEvents #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemotebuildbotCommandEvents #

toConstr :: GoogleDevtoolsRemotebuildbotCommandEvents -> Constr #

dataTypeOf :: GoogleDevtoolsRemotebuildbotCommandEvents -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemotebuildbotCommandEvents) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemotebuildbotCommandEvents) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemotebuildbotCommandEvents -> GoogleDevtoolsRemotebuildbotCommandEvents #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildbotCommandEvents -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemotebuildbotCommandEvents -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildbotCommandEvents -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemotebuildbotCommandEvents -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildbotCommandEvents -> m GoogleDevtoolsRemotebuildbotCommandEvents #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildbotCommandEvents -> m GoogleDevtoolsRemotebuildbotCommandEvents #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemotebuildbotCommandEvents -> m GoogleDevtoolsRemotebuildbotCommandEvents #

Show GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildbotCommandEvents Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemotebuildbotCommandEvents = D1 (MetaData "GoogleDevtoolsRemotebuildbotCommandEvents" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemotebuildbotCommandEvents'" PrefixI True) (S1 (MetaSel (Just "_gdrceDockerCacheHit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_gdrceNumErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_gdrceNumWarnings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))))))

googleDevtoolsRemotebuildbotCommandEvents :: GoogleDevtoolsRemotebuildbotCommandEvents Source #

Creates a value of GoogleDevtoolsRemotebuildbotCommandEvents with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdrceDockerCacheHit :: Lens' GoogleDevtoolsRemotebuildbotCommandEvents (Maybe Bool) Source #

Indicates whether we are using a cached Docker image (true) or had to pull the Docker image (false) for this command.

GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs

data GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source #

Describes the expected outputs of the command.

See: googleDevtoolsRemoteworkersV1test2CommandTaskOutputs smart constructor.

Instances
Eq GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> c GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs #

toConstr :: GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> Constr #

dataTypeOf :: GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs) #

gmapT :: (forall b. Data b => b -> b) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> m GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> m GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs -> m GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs #

Show GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs = D1 (MetaData "GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs'" PrefixI True) ((S1 (MetaSel (Just "_gdrvctoDirectories") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_gdrvctoStderrDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdrvctoFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_gdrvctoStdoutDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

gdrvctoDirectories :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs [Text] Source #

A list of expected directories, relative to the execution root. All paths MUST be delimited by forward slashes.

gdrvctoStderrDestination :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs (Maybe Text) Source #

The destination to which any stderr should be sent. The method by which the bot should send the stream contents to that destination is not defined in this API. As examples, the destination could be a file referenced in the `files` field in this message, or it could be a URI that must be written via the ByteStream API.

gdrvctoFiles :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs [Text] Source #

A list of expected files, relative to the execution root. All paths MUST be delimited by forward slashes.

gdrvctoStdoutDestination :: Lens' GoogleDevtoolsRemoteworkersV1test2CommandTaskOutputs (Maybe Text) Source #

The destination to which any stdout should be sent. The method by which the bot should send the stream contents to that destination is not defined in this API. As examples, the destination could be a file referenced in the `files` field in this message, or it could be a URI that must be written via the ByteStream API.

GoogleLongrunningOperation

data GoogleLongrunningOperation Source #

This resource represents a long-running operation that is the result of a network API call.

See: googleLongrunningOperation smart constructor.

Instances
Eq GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleLongrunningOperation -> c GoogleLongrunningOperation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleLongrunningOperation #

toConstr :: GoogleLongrunningOperation -> Constr #

dataTypeOf :: GoogleLongrunningOperation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleLongrunningOperation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleLongrunningOperation) #

gmapT :: (forall b. Data b => b -> b) -> GoogleLongrunningOperation -> GoogleLongrunningOperation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleLongrunningOperation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleLongrunningOperation -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleLongrunningOperation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleLongrunningOperation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleLongrunningOperation -> m GoogleLongrunningOperation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleLongrunningOperation -> m GoogleLongrunningOperation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleLongrunningOperation -> m GoogleLongrunningOperation #

Show GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Associated Types

type Rep GoogleLongrunningOperation :: Type -> Type #

ToJSON GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleLongrunningOperation Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep GoogleLongrunningOperation = D1 (MetaData "GoogleLongrunningOperation" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "GoogleLongrunningOperation'" PrefixI True) ((S1 (MetaSel (Just "_gloDone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gloError") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleRpcStatus))) :*: (S1 (MetaSel (Just "_gloResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleLongrunningOperationResponse)) :*: (S1 (MetaSel (Just "_gloName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gloMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleLongrunningOperationMetadata))))))

googleLongrunningOperation :: GoogleLongrunningOperation Source #

Creates a value of GoogleLongrunningOperation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gloDone :: Lens' GoogleLongrunningOperation (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.

gloError :: Lens' GoogleLongrunningOperation (Maybe GoogleRpcStatus) Source #

The error result of the operation in case of failure or cancellation.

gloResponse :: Lens' GoogleLongrunningOperation (Maybe GoogleLongrunningOperationResponse) 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`.

gloName :: Lens' GoogleLongrunningOperation (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 `operations/some/unique/name`.

gloMetadata :: Lens' GoogleLongrunningOperation (Maybe GoogleLongrunningOperationMetadata) Source #

Service-specific metadata associated with the operation. It typically contains progress information and common metadata such as create time. Some services might not provide such metadata. Any method that returns a long-running operation should document the metadata type, if any.

BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse

data BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source #

A response corresponding to a single blob that the client tried to upload.

See: buildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse #

toConstr :: BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse -> m BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse #

Show BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse = D1 (MetaData "BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" False) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse'" PrefixI True) (S1 (MetaSel (Just "_bStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleRpcStatus)) :*: S1 (MetaSel (Just "_bDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildBazelRemoteExecutionV2Digest))))

buildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse :: BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse Source #

Creates a value of BuildBazelRemoteExecutionV2BatchUpdateBlobsResponseResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

BuildBazelRemoteExecutionV2BatchReadBlobsResponse

data BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source #

A response message for ContentAddressableStorage.BatchReadBlobs.

See: buildBazelRemoteExecutionV2BatchReadBlobsResponse smart constructor.

Instances
Eq BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Data BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> c BuildBazelRemoteExecutionV2BatchReadBlobsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildBazelRemoteExecutionV2BatchReadBlobsResponse #

toConstr :: BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> Constr #

dataTypeOf :: BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildBazelRemoteExecutionV2BatchReadBlobsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildBazelRemoteExecutionV2BatchReadBlobsResponse) #

gmapT :: (forall b. Data b => b -> b) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> m BuildBazelRemoteExecutionV2BatchReadBlobsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> m BuildBazelRemoteExecutionV2BatchReadBlobsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildBazelRemoteExecutionV2BatchReadBlobsResponse -> m BuildBazelRemoteExecutionV2BatchReadBlobsResponse #

Show BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

Generic BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

ToJSON BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

FromJSON BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source # 
Instance details

Defined in Network.Google.RemoteBuildExecution.Types.Product

type Rep BuildBazelRemoteExecutionV2BatchReadBlobsResponse = D1 (MetaData "BuildBazelRemoteExecutionV2BatchReadBlobsResponse" "Network.Google.RemoteBuildExecution.Types.Product" "gogol-remotebuildexecution-0.4.0-1u4iV8qHDo9Hqh7sKQIjr5" True) (C1 (MetaCons "BuildBazelRemoteExecutionV2BatchReadBlobsResponse'" PrefixI True) (S1 (MetaSel (Just "_bbrevbrbrResponses") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildBazelRemoteExecutionV2BatchReadBlobsResponseResponse]))))

buildBazelRemoteExecutionV2BatchReadBlobsResponse :: BuildBazelRemoteExecutionV2BatchReadBlobsResponse Source #

Creates a value of BuildBazelRemoteExecutionV2BatchReadBlobsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired: