gogol-containerbuilder-0.4.0: Google Cloud Build 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.ContainerBuilder

Contents

Description

Creates and manages builds on Google Cloud Platform.

See: Cloud Build API Reference

Synopsis

Service Configuration

containerBuilderService :: ServiceConfig Source #

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

OAuth Scopes

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

View and manage your data across Google Cloud Platform services

API Declaration

Resources

cloudbuild.operations.cancel

cloudbuild.operations.get

cloudbuild.operations.list

cloudbuild.projects.builds.cancel

cloudbuild.projects.builds.create

cloudbuild.projects.builds.get

cloudbuild.projects.builds.list

cloudbuild.projects.builds.retry

cloudbuild.projects.triggers.create

cloudbuild.projects.triggers.delete

cloudbuild.projects.triggers.get

cloudbuild.projects.triggers.list

cloudbuild.projects.triggers.patch

cloudbuild.projects.triggers.run

Types

BuildStep

data BuildStep Source #

A step in the build pipeline.

See: buildStep smart constructor.

Instances
Eq BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildStep -> Constr #

dataTypeOf :: BuildStep -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildStep :: Type -> Type #

ToJSON BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildStep Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildStep = D1 (MetaData "BuildStep" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "BuildStep'" PrefixI True) (((S1 (MetaSel (Just "_bsStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildStepStatus)) :*: (S1 (MetaSel (Just "_bsDir") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bsArgs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))) :*: (S1 (MetaSel (Just "_bsEnv") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_bsPullTiming") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TimeSpan)) :*: S1 (MetaSel (Just "_bsEntrypoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_bsWaitFor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_bsName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bsId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_bsTiming") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TimeSpan)) :*: S1 (MetaSel (Just "_bsSecretEnv") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_bsTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: S1 (MetaSel (Just "_bsVolumes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Volume])))))))

buildStep :: BuildStep Source #

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

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

bsStatus :: Lens' BuildStep (Maybe BuildStepStatus) Source #

Output only. Status of the build step. At this time, build step status is only updated on build completion; step status is not updated in real-time as the build progresses.

bsDir :: Lens' BuildStep (Maybe Text) Source #

Working directory to use when running this step's container. If this value is a relative path, it is relative to the build's working directory. If this value is absolute, it may be outside the build's working directory, in which case the contents of the path may not be persisted across build step executions, unless a `volume` for that path is specified. If the build specifies a `RepoSource` with `dir` and a step with a `dir`, which specifies an absolute path, the `RepoSource` `dir` is ignored for the step's execution.

bsArgs :: Lens' BuildStep [Text] Source #

A list of arguments that will be presented to the step when it is started. If the image used to run the step's container has an entrypoint, the `args` are used as arguments to that entrypoint. If the image does not define an entrypoint, the first element in args is used as the entrypoint, and the remainder will be used as arguments.

bsEnv :: Lens' BuildStep [Text] Source #

A list of environment variable definitions to be used when running a step. The elements are of the form "KEY=VALUE" for the environment variable "KEY" being given the value "VALUE".

bsPullTiming :: Lens' BuildStep (Maybe TimeSpan) Source #

Output only. Stores timing information for pulling this build step's builder image only.

bsEntrypoint :: Lens' BuildStep (Maybe Text) Source #

Entrypoint to be used instead of the build step image's default entrypoint. If unset, the image's default entrypoint is used.

bsWaitFor :: Lens' BuildStep [Text] Source #

The ID(s) of the step(s) that this build step depends on. This build step will not start until all the build steps in `wait_for` have completed successfully. If `wait_for` is empty, this build step will start when all previous build steps in the `Build.Steps` list have completed successfully.

bsName :: Lens' BuildStep (Maybe Text) Source #

Required. The name of the container image that will run this particular build step. If the image is available in the host's Docker daemon's cache, it will be run directly. If not, the host will attempt to pull the image first, using the builder service account's credentials if necessary. The Docker daemon's cache will already have the latest versions of all of the officially supported build steps ([https://github.com/GoogleCloudPlatform/cloud-builders](https://github.com/GoogleCloudPlatform/cloud-builders)). The Docker daemon will also have cached many of the layers for some popular images, like "ubuntu", "debian", but they will be refreshed at the time you attempt to use them. If you built an image in a previous build step, it will be stored in the host's Docker daemon's cache and is available to use as the name for a later build step.

bsId :: Lens' BuildStep (Maybe Text) Source #

Unique identifier for this build step, used in `wait_for` to reference this build step as a dependency.

bsTiming :: Lens' BuildStep (Maybe TimeSpan) Source #

Output only. Stores timing information for executing this build step.

bsSecretEnv :: Lens' BuildStep [Text] Source #

A list of environment variables which are encrypted using a Cloud Key Management Service crypto key. These values must be specified in the build's `Secret`.

bsTimeout :: Lens' BuildStep (Maybe Scientific) Source #

Time limit for executing this build step. If not defined, the step has no time limit and will be allowed to continue to run until either it completes or the build itself times out.

bsVolumes :: Lens' BuildStep [Volume] Source #

List of volumes to mount into the build step. Each volume is created as an empty volume prior to execution of the build step. Upon completion of the build, volumes and their contents are discarded. Using a named volume in only one step is not valid as it is indicative of a build request with an incorrect configuration.

SourceProvenance

data SourceProvenance Source #

Provenance of the source. Ways to find the original source, or verify that some source was used for this build.

See: sourceProvenance smart constructor.

Instances
Eq SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: SourceProvenance -> Constr #

dataTypeOf :: SourceProvenance -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep SourceProvenance :: Type -> Type #

ToJSON SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep SourceProvenance Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep SourceProvenance = D1 (MetaData "SourceProvenance" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "SourceProvenance'" PrefixI True) (S1 (MetaSel (Just "_spResolvedRepoSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepoSource)) :*: (S1 (MetaSel (Just "_spResolvedStorageSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StorageSource)) :*: S1 (MetaSel (Just "_spFileHashes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SourceProvenanceFileHashes)))))

sourceProvenance :: SourceProvenance Source #

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

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

spResolvedRepoSource :: Lens' SourceProvenance (Maybe RepoSource) Source #

A copy of the build's `source.repo_source`, if exists, with any revisions resolved.

spResolvedStorageSource :: Lens' SourceProvenance (Maybe StorageSource) Source #

A copy of the build's `source.storage_source`, if exists, with any generations resolved.

spFileHashes :: Lens' SourceProvenance (Maybe SourceProvenanceFileHashes) Source #

Output only. Hash(es) of the build source, which can be used to verify that the originalsource integrity was maintained in the build. Note that `FileHashes` willonly be populated if `BuildOptions` has requested a `SourceProvenanceHash`. The keys to this map are file paths used as build source and the values contain the hash values for those files. If the build source came in a single package such as a gzipped tarfile (`.tar.gz`), the `FileHash` will be for the single path to that file.

ListBuildsResponse

data ListBuildsResponse Source #

Response including listed builds.

See: listBuildsResponse smart constructor.

Instances
Eq ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: ListBuildsResponse -> Constr #

dataTypeOf :: ListBuildsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep ListBuildsResponse :: Type -> Type #

ToJSON ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ListBuildsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ListBuildsResponse = D1 (MetaData "ListBuildsResponse" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "ListBuildsResponse'" PrefixI True) (S1 (MetaSel (Just "_lbrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lbrBuilds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Build]))))

listBuildsResponse :: ListBuildsResponse Source #

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

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

lbrNextPageToken :: Lens' ListBuildsResponse (Maybe Text) Source #

Token to receive the next page of results.

lbrBuilds :: Lens' ListBuildsResponse [Build] Source #

Builds will be sorted by `create_time`, descending.

Status

data Status Source #

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

See: status smart constructor.

Instances
Eq Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Status :: Type -> Type #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

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

status :: Status Source #

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

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

sDetails :: Lens' Status [StatusDetailsItem] Source #

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

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

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

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

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

RetryBuildRequest

data RetryBuildRequest Source #

Specifies a build to retry.

See: retryBuildRequest smart constructor.

Instances
Eq RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: RetryBuildRequest -> Constr #

dataTypeOf :: RetryBuildRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep RetryBuildRequest :: Type -> Type #

ToJSON RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep RetryBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep RetryBuildRequest = D1 (MetaData "RetryBuildRequest" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "RetryBuildRequest'" PrefixI False) (U1 :: Type -> Type))

retryBuildRequest :: RetryBuildRequest Source #

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

ListOperationsResponse

data ListOperationsResponse Source #

The response message for Operations.ListOperations.

See: listOperationsResponse smart constructor.

Instances
Eq ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: ListOperationsResponse -> Constr #

dataTypeOf :: ListOperationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep ListOperationsResponse :: Type -> Type #

ToJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ListOperationsResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

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

listOperationsResponse :: ListOperationsResponse Source #

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

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

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

The standard List next-page token.

lorOperations :: Lens' ListOperationsResponse [Operation] Source #

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

CancelOperationRequest

data CancelOperationRequest Source #

The request message for Operations.CancelOperation.

See: cancelOperationRequest smart constructor.

Instances
Eq CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: CancelOperationRequest -> Constr #

dataTypeOf :: CancelOperationRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep CancelOperationRequest :: Type -> Type #

ToJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep CancelOperationRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep CancelOperationRequest = D1 (MetaData "CancelOperationRequest" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "CancelOperationRequest'" PrefixI False) (U1 :: Type -> Type))

cancelOperationRequest :: CancelOperationRequest Source #

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

Hash

data Hash Source #

Container message for hash values.

See: hash smart constructor.

Instances
Eq Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Hash -> Constr #

dataTypeOf :: Hash -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

showsPrec :: Int -> Hash -> ShowS #

show :: Hash -> String #

showList :: [Hash] -> ShowS #

Generic Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Hash :: Type -> Type #

Methods

from :: Hash -> Rep Hash x #

to :: Rep Hash x -> Hash #

ToJSON Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Hash Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Hash = D1 (MetaData "Hash" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Hash'" PrefixI True) (S1 (MetaSel (Just "_hValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_hType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HashType))))

hash :: Hash Source #

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

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

hValue :: Lens' Hash (Maybe ByteString) Source #

The hash value.

hType :: Lens' Hash (Maybe HashType) Source #

The type of hash that was performed.

Results

data Results Source #

Artifacts created by the build pipeline.

See: results smart constructor.

Instances
Eq Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Results -> Constr #

dataTypeOf :: Results -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Results :: Type -> Type #

Methods

from :: Results -> Rep Results x #

to :: Rep Results x -> Results #

ToJSON Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Results Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Results = D1 (MetaData "Results" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Results'" PrefixI True) ((S1 (MetaSel (Just "_rImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuiltImage])) :*: S1 (MetaSel (Just "_rBuildStepImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_rArtifactManifest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rBuildStepOutputs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Bytes])) :*: S1 (MetaSel (Just "_rNumArtifacts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))

results :: Results Source #

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

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

rImages :: Lens' Results [BuiltImage] Source #

Container images that were built as a part of the build.

rBuildStepImages :: Lens' Results [Text] Source #

List of build step digests, in the order corresponding to build step indices.

rArtifactManifest :: Lens' Results (Maybe Text) Source #

Path to the artifact manifest. Only populated when artifacts are uploaded.

rBuildStepOutputs :: Lens' Results [ByteString] Source #

List of build step outputs, produced by builder images, in the order corresponding to build step indices. Cloud Builders can produce this output by writing to `$BUILDER_OUTPUT/output`. Only the first 4KB of data is stored.

rNumArtifacts :: Lens' Results (Maybe Int64) Source #

Number of artifacts uploaded. Only populated when artifacts are uploaded.

BuildTriggerSubstitutions

data BuildTriggerSubstitutions Source #

Substitutions data for Build resource.

See: buildTriggerSubstitutions smart constructor.

Instances
Eq BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildTriggerSubstitutions -> Constr #

dataTypeOf :: BuildTriggerSubstitutions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildTriggerSubstitutions :: Type -> Type #

ToJSON BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildTriggerSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildTriggerSubstitutions = D1 (MetaData "BuildTriggerSubstitutions" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "BuildTriggerSubstitutions'" PrefixI True) (S1 (MetaSel (Just "_btsAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

buildTriggerSubstitutions Source #

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

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

RepoSource

data RepoSource Source #

Location of the source in a Google Cloud Source Repository.

See: repoSource smart constructor.

Instances
Eq RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: RepoSource -> Constr #

dataTypeOf :: RepoSource -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep RepoSource :: Type -> Type #

ToJSON RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep RepoSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep RepoSource = D1 (MetaData "RepoSource" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "RepoSource'" PrefixI True) ((S1 (MetaSel (Just "_rsRepoName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rsDir") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rsCommitSha") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_rsBranchName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rsTagName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rsProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

repoSource :: RepoSource Source #

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

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

rsRepoName :: Lens' RepoSource (Maybe Text) Source #

Name of the Cloud Source Repository. If omitted, the name "default" is assumed.

rsDir :: Lens' RepoSource (Maybe Text) Source #

Directory, relative to the source root, in which to run the build. This must be a relative path. If a step's `dir` is specified and is an absolute path, this value is ignored for that step's execution.

rsCommitSha :: Lens' RepoSource (Maybe Text) Source #

Explicit commit SHA to build.

rsBranchName :: Lens' RepoSource (Maybe Text) Source #

Name of the branch to build.

rsTagName :: Lens' RepoSource (Maybe Text) Source #

Name of the tag to build.

rsProjectId :: Lens' RepoSource (Maybe Text) Source #

ID of the project that owns the Cloud Source Repository. If omitted, the project ID requesting the build is assumed.

Operation

data Operation Source #

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

See: operation smart constructor.

Instances
Eq Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Operation -> Constr #

dataTypeOf :: Operation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

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

operation :: Operation Source #

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

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

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

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

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

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

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

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

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

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

oMetadata :: Lens' Operation (Maybe OperationMetadata) 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.

Empty

data Empty Source #

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

See: empty smart constructor.

Instances
Eq Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Empty -> Constr #

dataTypeOf :: Empty -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Empty :: Type -> Type #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Empty'" PrefixI False) (U1 :: Type -> Type))

empty :: Empty Source #

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

SecretSecretEnv

data SecretSecretEnv Source #

Map of environment variable name to its encrypted value. Secret environment variables must be unique across all of a build's secrets, and must be used by at least one build step. Values can be at most 64 KB in size. There can be at most 100 secret values across all of a build's secrets.

See: secretSecretEnv smart constructor.

Instances
Eq SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: SecretSecretEnv -> Constr #

dataTypeOf :: SecretSecretEnv -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep SecretSecretEnv :: Type -> Type #

ToJSON SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep SecretSecretEnv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep SecretSecretEnv = D1 (MetaData "SecretSecretEnv" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "SecretSecretEnv'" PrefixI True) (S1 (MetaSel (Just "_sseAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Bytes))))

secretSecretEnv Source #

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

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

Artifacts

data Artifacts Source #

Artifacts produced by a build that should be uploaded upon successful completion of all build steps.

See: artifacts smart constructor.

Instances
Eq Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Artifacts -> Constr #

dataTypeOf :: Artifacts -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Artifacts :: Type -> Type #

ToJSON Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Artifacts Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Artifacts = D1 (MetaData "Artifacts" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Artifacts'" PrefixI True) (S1 (MetaSel (Just "_aImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_aObjects") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ArtifactObjects))))

artifacts :: Artifacts Source #

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

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

aImages :: Lens' Artifacts [Text] Source #

A list of images to be pushed upon the successful completion of all build steps. The images will be pushed using the builder service account's credentials. The digests of the pushed images will be stored in the Build resource's results field. If any of the images fail to be pushed, the build is marked FAILURE.

aObjects :: Lens' Artifacts (Maybe ArtifactObjects) Source #

A list of objects to be uploaded to Cloud Storage upon successful completion of all build steps. Files in the workspace matching specified paths globs will be uploaded to the specified Cloud Storage location using the builder service account's credentials. The location and generation of the uploaded objects will be stored in the Build resource's results field. If any objects fail to be pushed, the build is marked FAILURE.

BuildStepStatus

data BuildStepStatus Source #

Output only. Status of the build step. At this time, build step status is only updated on build completion; step status is not updated in real-time as the build progresses.

Constructors

StatusUnknown

STATUS_UNKNOWN Status of the build is unknown.

Queued

QUEUED Build or step is queued; work has not yet begun.

Working

WORKING Build or step is being executed.

Success

SUCCESS Build or step finished successfully.

Failure

FAILURE Build or step failed to complete successfully.

InternalError

INTERNAL_ERROR Build or step failed due to an internal cause.

Timeout

TIMEOUT Build or step took longer than was allowed.

Cancelled

CANCELLED Build or step was canceled by a user.

Instances
Enum BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildStepStatus -> Constr #

dataTypeOf :: BuildStepStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildStepStatus :: Type -> Type #

Hashable BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildStepStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildStepStatus = D1 (MetaData "BuildStepStatus" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (((C1 (MetaCons "StatusUnknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Queued" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Working" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Success" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Failure" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "InternalError" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Timeout" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Cancelled" PrefixI False) (U1 :: Type -> Type))))

ArtifactObjects

data ArtifactObjects Source #

Files in the workspace to upload to Cloud Storage upon successful completion of all build steps.

See: artifactObjects smart constructor.

Instances
Eq ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: ArtifactObjects -> Constr #

dataTypeOf :: ArtifactObjects -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep ArtifactObjects :: Type -> Type #

ToJSON ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ArtifactObjects Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ArtifactObjects = D1 (MetaData "ArtifactObjects" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "ArtifactObjects'" PrefixI True) (S1 (MetaSel (Just "_aoLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_aoTiming") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TimeSpan)) :*: S1 (MetaSel (Just "_aoPaths") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

artifactObjects :: ArtifactObjects Source #

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

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

aoLocation :: Lens' ArtifactObjects (Maybe Text) Source #

Cloud Storage bucket and optional object path, in the form "gs://bucket/path/to/somewhere/". (see Bucket Name Requirements). Files in the workspace matching any path pattern will be uploaded to Cloud Storage with this location as a prefix.

aoTiming :: Lens' ArtifactObjects (Maybe TimeSpan) Source #

Output only. Stores timing information for pushing all artifact objects.

aoPaths :: Lens' ArtifactObjects [Text] Source #

Path globs used to match files in the build's workspace.

Volume

data Volume Source #

Volume describes a Docker container volume which is mounted into build steps in order to persist files across build step execution.

See: volume smart constructor.

Instances
Eq Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Volume -> Constr #

dataTypeOf :: Volume -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Volume :: Type -> Type #

Methods

from :: Volume -> Rep Volume x #

to :: Rep Volume x -> Volume #

ToJSON Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Volume Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Volume = D1 (MetaData "Volume" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Volume'" PrefixI True) (S1 (MetaSel (Just "_vPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_vName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

volume :: Volume Source #

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

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

vPath :: Lens' Volume (Maybe Text) Source #

Path at which to mount the volume. Paths must be absolute and cannot conflict with other volume paths on the same build step or with certain reserved volume paths.

vName :: Lens' Volume (Maybe Text) Source #

Name of the volume to mount. Volume names must be unique per build step and must be valid names for Docker volumes. Each named volume must be used by at least two build steps.

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: StatusDetailsItem -> Constr #

dataTypeOf :: StatusDetailsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

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

statusDetailsItem Source #

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

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

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

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

Build

data Build Source #

Instances
Eq Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Build -> Constr #

dataTypeOf :: Build -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

showsPrec :: Int -> Build -> ShowS #

show :: Build -> String #

showList :: [Build] -> ShowS #

Generic Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Build :: Type -> Type #

Methods

from :: Build -> Rep Build x #

to :: Rep Build x -> Build #

ToJSON Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Build Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Build = D1 (MetaData "Build" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Build'" PrefixI True) ((((S1 (MetaSel (Just "_bImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_bStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildStatus))) :*: (S1 (MetaSel (Just "_bSourceProvenance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SourceProvenance)) :*: (S1 (MetaSel (Just "_bSubstitutions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildSubstitutions)) :*: S1 (MetaSel (Just "_bLogURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_bResults") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Results)) :*: (S1 (MetaSel (Just "_bSecrets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Secret])) :*: S1 (MetaSel (Just "_bStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))) :*: (S1 (MetaSel (Just "_bArtifacts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Artifacts)) :*: (S1 (MetaSel (Just "_bLogsBucket") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bSteps") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildStep])))))) :*: (((S1 (MetaSel (Just "_bStatusDetail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Source))) :*: (S1 (MetaSel (Just "_bId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_bOptions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptions)) :*: S1 (MetaSel (Just "_bProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_bTiming") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildTiming)) :*: (S1 (MetaSel (Just "_bBuildTriggerId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)))) :*: (S1 (MetaSel (Just "_bFinishTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: (S1 (MetaSel (Just "_bCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_bTags") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))))

bImages :: Lens' Build [Text] Source #

A list of images to be pushed upon the successful completion of all build steps. The images are pushed using the builder service account's credentials. The digests of the pushed images will be stored in the `Build` resource's results field. If any of the images fail to be pushed, the build status is marked `FAILURE`.

bStatus :: Lens' Build (Maybe BuildStatus) Source #

Output only. Status of the build.

bSourceProvenance :: Lens' Build (Maybe SourceProvenance) Source #

Output only. A permanent fixed identifier for source.

bSubstitutions :: Lens' Build (Maybe BuildSubstitutions) Source #

Substitutions data for `Build` resource.

bLogURL :: Lens' Build (Maybe Text) Source #

Output only. URL to logs for this build in Google Cloud Console.

bResults :: Lens' Build (Maybe Results) Source #

Output only. Results of the build.

bSecrets :: Lens' Build [Secret] Source #

Secrets to decrypt using Cloud Key Management Service.

bStartTime :: Lens' Build (Maybe UTCTime) Source #

Output only. Time at which execution of the build was started.

bArtifacts :: Lens' Build (Maybe Artifacts) Source #

Artifacts produced by the build that should be uploaded upon successful completion of all build steps.

bLogsBucket :: Lens' Build (Maybe Text) Source #

Google Cloud Storage bucket where logs should be written (see Bucket Name Requirements). Logs file names will be of the format `logsbucket/log−{build_id}.txt`.

bSteps :: Lens' Build [BuildStep] Source #

Required. The operations to be performed on the workspace.

bStatusDetail :: Lens' Build (Maybe Text) Source #

Output only. Customer-readable message about the current status.

bSource :: Lens' Build (Maybe Source) Source #

The location of the source files to build.

bId :: Lens' Build (Maybe Text) Source #

Output only. Unique identifier of the build.

bOptions :: Lens' Build (Maybe BuildOptions) Source #

Special options for this build.

bProjectId :: Lens' Build (Maybe Text) Source #

Output only. ID of the project.

bTiming :: Lens' Build (Maybe BuildTiming) Source #

Output only. Stores timing information for phases of the build. Valid keys are: * BUILD: time to execute all build steps * PUSH: time to push all specified images. * FETCHSOURCE: time to fetch source. If the build does not specify source or images, these keys will not be included.

bBuildTriggerId :: Lens' Build (Maybe Text) Source #

Output only. The ID of the `BuildTrigger` that triggered this build, if it was triggered automatically.

bTimeout :: Lens' Build (Maybe Scientific) Source #

Amount of time that this build should be allowed to run, to second granularity. If this amount of time elapses, work on the build will cease and the build status will be `TIMEOUT`. Default time is ten minutes.

bFinishTime :: Lens' Build (Maybe UTCTime) Source #

Output only. Time at which execution of the build was finished. The difference between finish_time and start_time is the duration of the build's execution.

bCreateTime :: Lens' Build (Maybe UTCTime) Source #

Output only. Time at which the request to create the build was received.

bTags :: Lens' Build [Text] Source #

Tags for annotation of a `Build`. These are not docker tags.

SourceProvenanceFileHashes

data SourceProvenanceFileHashes Source #

Output only. Hash(es) of the build source, which can be used to verify that the originalsource integrity was maintained in the build. Note that `FileHashes` willonly be populated if `BuildOptions` has requested a `SourceProvenanceHash`. The keys to this map are file paths used as build source and the values contain the hash values for those files. If the build source came in a single package such as a gzipped tarfile (`.tar.gz`), the `FileHash` will be for the single path to that file.

See: sourceProvenanceFileHashes smart constructor.

Instances
Eq SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: SourceProvenanceFileHashes -> Constr #

dataTypeOf :: SourceProvenanceFileHashes -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep SourceProvenanceFileHashes :: Type -> Type #

ToJSON SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep SourceProvenanceFileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep SourceProvenanceFileHashes = D1 (MetaData "SourceProvenanceFileHashes" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "SourceProvenanceFileHashes'" PrefixI True) (S1 (MetaSel (Just "_spfhAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text FileHashes))))

sourceProvenanceFileHashes Source #

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

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

Secret

data Secret Source #

Pairs a set of secret environment variables containing encrypted values with the Cloud KMS key to use to decrypt the value.

See: secret smart constructor.

Instances
Eq Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Secret -> Constr #

dataTypeOf :: Secret -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Secret :: Type -> Type #

Methods

from :: Secret -> Rep Secret x #

to :: Rep Secret x -> Secret #

ToJSON Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Secret Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Secret = D1 (MetaData "Secret" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Secret'" PrefixI True) (S1 (MetaSel (Just "_sKmsKeyName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sSecretEnv") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SecretSecretEnv))))

secret :: Secret Source #

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

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

sKmsKeyName :: Lens' Secret (Maybe Text) Source #

Cloud KMS key name to use to decrypt these envs.

sSecretEnv :: Lens' Secret (Maybe SecretSecretEnv) Source #

Map of environment variable name to its encrypted value. Secret environment variables must be unique across all of a build's secrets, and must be used by at least one build step. Values can be at most 64 KB in size. There can be at most 100 secret values across all of a build's secrets.

CancelBuildRequest

data CancelBuildRequest Source #

Request to cancel an ongoing build.

See: cancelBuildRequest smart constructor.

Instances
Eq CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: CancelBuildRequest -> Constr #

dataTypeOf :: CancelBuildRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep CancelBuildRequest :: Type -> Type #

ToJSON CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep CancelBuildRequest Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep CancelBuildRequest = D1 (MetaData "CancelBuildRequest" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "CancelBuildRequest'" PrefixI False) (U1 :: Type -> Type))

cancelBuildRequest :: CancelBuildRequest Source #

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

TimeSpan

data TimeSpan Source #

Start and end times for a build execution phase.

See: timeSpan smart constructor.

Instances
Eq TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: TimeSpan -> Constr #

dataTypeOf :: TimeSpan -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep TimeSpan :: Type -> Type #

Methods

from :: TimeSpan -> Rep TimeSpan x #

to :: Rep TimeSpan x -> TimeSpan #

ToJSON TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep TimeSpan Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep TimeSpan = D1 (MetaData "TimeSpan" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "TimeSpan'" PrefixI True) (S1 (MetaSel (Just "_tsStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_tsEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))

timeSpan :: TimeSpan Source #

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

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

tsStartTime :: Lens' TimeSpan (Maybe UTCTime) Source #

Start of time span.

tsEndTime :: Lens' TimeSpan (Maybe UTCTime) Source #

End of time span.

StorageSource

data StorageSource Source #

Location of the source in an archive file in Google Cloud Storage.

See: storageSource smart constructor.

Instances
Eq StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: StorageSource -> Constr #

dataTypeOf :: StorageSource -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep StorageSource :: Type -> Type #

ToJSON StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep StorageSource Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep StorageSource = D1 (MetaData "StorageSource" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "StorageSource'" PrefixI True) (S1 (MetaSel (Just "_ssBucket") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_ssObject") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssGeneration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

storageSource :: StorageSource Source #

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

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

ssBucket :: Lens' StorageSource (Maybe Text) Source #

Google Cloud Storage bucket containing the source (see Bucket Name Requirements).

ssObject :: Lens' StorageSource (Maybe Text) Source #

Google Cloud Storage object containing the source. This object must be a gzipped archive file (`.tar.gz`) containing source to build.

ssGeneration :: Lens' StorageSource (Maybe Int64) Source #

Google Cloud Storage generation for the object. If the generation is omitted, the latest generation will be used.

ListBuildTriggersResponse

data ListBuildTriggersResponse Source #

Response containing existing `BuildTriggers`.

See: listBuildTriggersResponse smart constructor.

Instances
Eq ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: ListBuildTriggersResponse -> Constr #

dataTypeOf :: ListBuildTriggersResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep ListBuildTriggersResponse :: Type -> Type #

ToJSON ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ListBuildTriggersResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ListBuildTriggersResponse = D1 (MetaData "ListBuildTriggersResponse" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "ListBuildTriggersResponse'" PrefixI True) (S1 (MetaSel (Just "_lbtrTriggers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [BuildTrigger]))))

listBuildTriggersResponse :: ListBuildTriggersResponse Source #

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

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

lbtrTriggers :: Lens' ListBuildTriggersResponse [BuildTrigger] Source #

`BuildTriggers` for the project, sorted by `create_time` descending.

ArtifactResult

data ArtifactResult Source #

An artifact that was uploaded during a build. This is a single record in the artifact manifest JSON file.

See: artifactResult smart constructor.

Instances
Eq ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: ArtifactResult -> Constr #

dataTypeOf :: ArtifactResult -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep ArtifactResult :: Type -> Type #

ToJSON ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ArtifactResult Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep ArtifactResult = D1 (MetaData "ArtifactResult" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "ArtifactResult'" PrefixI True) (S1 (MetaSel (Just "_arFileHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [FileHashes])) :*: S1 (MetaSel (Just "_arLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

artifactResult :: ArtifactResult Source #

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

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

arFileHash :: Lens' ArtifactResult [FileHashes] Source #

The file hash of the artifact.

arLocation :: Lens' ArtifactResult (Maybe Text) Source #

The path of an artifact in a Google Cloud Storage bucket, with the generation number. For example, `gs://mybucket/path/to/output.jar#generation`.

BuildOptionsRequestedVerifyOption

data BuildOptionsRequestedVerifyOption Source #

Requested verifiability options.

Constructors

NotVerified

NOT_VERIFIED Not a verifiable build. (default)

Verified

VERIFIED Verified build.

Instances
Enum BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildOptionsRequestedVerifyOption -> Constr #

dataTypeOf :: BuildOptionsRequestedVerifyOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildOptionsRequestedVerifyOption :: Type -> Type #

Hashable BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsRequestedVerifyOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsRequestedVerifyOption = D1 (MetaData "BuildOptionsRequestedVerifyOption" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "NotVerified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Verified" PrefixI False) (U1 :: Type -> Type))

FileHashes

data FileHashes Source #

Container message for hashes of byte content of files, used in SourceProvenance messages to verify integrity of source input to the build.

See: fileHashes smart constructor.

Instances
Eq FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: FileHashes -> Constr #

dataTypeOf :: FileHashes -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep FileHashes :: Type -> Type #

ToJSON FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep FileHashes Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep FileHashes = D1 (MetaData "FileHashes" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "FileHashes'" PrefixI True) (S1 (MetaSel (Just "_fhFileHash") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Hash]))))

fileHashes :: FileHashes Source #

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

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

fhFileHash :: Lens' FileHashes [Hash] Source #

Collection of file hashes.

BuildSubstitutions

data BuildSubstitutions Source #

Substitutions data for `Build` resource.

See: buildSubstitutions smart constructor.

Instances
Eq BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildSubstitutions -> Constr #

dataTypeOf :: BuildSubstitutions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildSubstitutions :: Type -> Type #

ToJSON BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildSubstitutions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildSubstitutions = D1 (MetaData "BuildSubstitutions" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "BuildSubstitutions'" PrefixI True) (S1 (MetaSel (Just "_bsAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

buildSubstitutions Source #

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

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

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.ContainerBuilder.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.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.ContainerBuilder.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.ContainerBuilder.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.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.ContainerBuilder.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

BuildStatus

data BuildStatus Source #

Output only. Status of the build.

Constructors

BSStatusUnknown

STATUS_UNKNOWN Status of the build is unknown.

BSQueued

QUEUED Build or step is queued; work has not yet begun.

BSWorking

WORKING Build or step is being executed.

BSSuccess

SUCCESS Build or step finished successfully.

BSFailure

FAILURE Build or step failed to complete successfully.

BSInternalError

INTERNAL_ERROR Build or step failed due to an internal cause.

BSTimeout

TIMEOUT Build or step took longer than was allowed.

BSCancelled

CANCELLED Build or step was canceled by a user.

Instances
Enum BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildStatus -> Constr #

dataTypeOf :: BuildStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildStatus :: Type -> Type #

Hashable BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildStatus Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildStatus = D1 (MetaData "BuildStatus" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (((C1 (MetaCons "BSStatusUnknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BSQueued" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BSWorking" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BSSuccess" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "BSFailure" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BSInternalError" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BSTimeout" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BSCancelled" PrefixI False) (U1 :: Type -> Type))))

BuildOptionsSubstitutionOption

data BuildOptionsSubstitutionOption Source #

Option to specify behavior when there is an error in the substitution checks.

Constructors

MustMatch

MUST_MATCH Fails the build if error in substitutions checks, like missing a substitution in the template or in the map.

AllowLoose

ALLOW_LOOSE Do not fail the build if error in substitutions checks.

Instances
Enum BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildOptionsSubstitutionOption -> Constr #

dataTypeOf :: BuildOptionsSubstitutionOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildOptionsSubstitutionOption :: Type -> Type #

Hashable BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsSubstitutionOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsSubstitutionOption = D1 (MetaData "BuildOptionsSubstitutionOption" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "MustMatch" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AllowLoose" PrefixI False) (U1 :: Type -> Type))

HashType

data HashType Source #

The type of hash that was performed.

Constructors

None

NONE No hash requested.

SHA256

SHA256 Use a sha256 hash.

MD5

MD5 Use a md5 hash.

Instances
Enum HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: HashType -> Constr #

dataTypeOf :: HashType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep HashType :: Type -> Type #

Methods

from :: HashType -> Rep HashType x #

to :: Rep HashType x -> HashType #

Hashable HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

hashWithSalt :: Int -> HashType -> Int #

hash :: HashType -> Int #

ToJSON HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep HashType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep HashType = D1 (MetaData "HashType" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "None" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SHA256" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MD5" PrefixI False) (U1 :: Type -> Type)))

BuildOptionsLogStreamingOption

data BuildOptionsLogStreamingOption Source #

Option to define build log streaming behavior to Google Cloud Storage.

Constructors

StreamDefault

STREAM_DEFAULT Service may automatically determine build log streaming behavior.

StreamOn

STREAM_ON Build logs should be streamed to Google Cloud Storage.

StreamOff

STREAM_OFF Build logs should not be streamed to Google Cloud Storage; they will be written when the build is completed.

Instances
Enum BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildOptionsLogStreamingOption -> Constr #

dataTypeOf :: BuildOptionsLogStreamingOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildOptionsLogStreamingOption :: Type -> Type #

Hashable BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsLogStreamingOption Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsLogStreamingOption = D1 (MetaData "BuildOptionsLogStreamingOption" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "StreamDefault" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "StreamOn" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "StreamOff" PrefixI False) (U1 :: Type -> Type)))

Source

data Source Source #

Location of the source in a supported storage service.

See: source smart constructor.

Instances
Eq Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

Data Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: Source -> Constr #

dataTypeOf :: Source -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep Source :: Type -> Type #

Methods

from :: Source -> Rep Source x #

to :: Rep Source x -> Source #

ToJSON Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Source Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep Source = D1 (MetaData "Source" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Source'" PrefixI True) (S1 (MetaSel (Just "_sRepoSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepoSource)) :*: S1 (MetaSel (Just "_sStorageSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StorageSource))))

source :: Source Source #

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

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

sRepoSource :: Lens' Source (Maybe RepoSource) Source #

If provided, get the source from this location in a Cloud Source Repository.

sStorageSource :: Lens' Source (Maybe StorageSource) Source #

If provided, get the source from this location in Google Cloud Storage.

BuildOptionsLogging

data BuildOptionsLogging Source #

Option to specify the logging mode, which determines where the logs are stored.

Constructors

LoggingUnspecified

LOGGING_UNSPECIFIED The service determines the logging mode. The default is `LEGACY`. Do not rely on the default logging behavior as it may change in the future.

Legacy

LEGACY Stackdriver logging and Cloud Storage logging are enabled.

GcsOnly

GCS_ONLY Only Cloud Storage logging is enabled.

Instances
Enum BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildOptionsLogging -> Constr #

dataTypeOf :: BuildOptionsLogging -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildOptionsLogging :: Type -> Type #

Hashable BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsLogging Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsLogging = D1 (MetaData "BuildOptionsLogging" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "LoggingUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Legacy" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GcsOnly" PrefixI False) (U1 :: Type -> Type)))

OperationMetadata

data OperationMetadata 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: operationMetadata smart constructor.

Instances
Eq OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: OperationMetadata -> Constr #

dataTypeOf :: OperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

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

operationMetadata Source #

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

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

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

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

BuildOptionsMachineType

data BuildOptionsMachineType Source #

Compute Engine machine type on which to run the build.

Constructors

Unspecified

UNSPECIFIED Standard machine type.

N1Highcpu8

N1_HIGHCPU_8 Highcpu machine with 8 CPUs.

N1Highcpu32

N1_HIGHCPU_32 Highcpu machine with 32 CPUs.

Instances
Enum BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Eq BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Data BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Methods

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

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

toConstr :: BuildOptionsMachineType -> Constr #

dataTypeOf :: BuildOptionsMachineType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Read BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Show BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Generic BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

Associated Types

type Rep BuildOptionsMachineType :: Type -> Type #

Hashable BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToJSON BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromJSON BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

FromHttpApiData BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

ToHttpApiData BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsMachineType Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Sum

type Rep BuildOptionsMachineType = D1 (MetaData "BuildOptionsMachineType" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "Unspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "N1Highcpu8" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "N1Highcpu32" PrefixI False) (U1 :: Type -> Type)))

BuildTiming

data BuildTiming Source #

Output only. Stores timing information for phases of the build. Valid keys are: * BUILD: time to execute all build steps * PUSH: time to push all specified images. * FETCHSOURCE: time to fetch source. If the build does not specify source or images, these keys will not be included.

See: buildTiming smart constructor.

Instances
Eq BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildTiming -> Constr #

dataTypeOf :: BuildTiming -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildTiming :: Type -> Type #

ToJSON BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildTiming Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildTiming = D1 (MetaData "BuildTiming" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "BuildTiming'" PrefixI True) (S1 (MetaSel (Just "_btAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text TimeSpan))))

buildTiming Source #

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

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

BuildOperationMetadata

data BuildOperationMetadata Source #

Metadata for build operations.

See: buildOperationMetadata smart constructor.

Instances
Eq BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildOperationMetadata -> Constr #

dataTypeOf :: BuildOperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildOperationMetadata :: Type -> Type #

ToJSON BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildOperationMetadata Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildOperationMetadata = D1 (MetaData "BuildOperationMetadata" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" True) (C1 (MetaCons "BuildOperationMetadata'" PrefixI True) (S1 (MetaSel (Just "_bomBuild") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Build))))

buildOperationMetadata :: BuildOperationMetadata Source #

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

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

bomBuild :: Lens' BuildOperationMetadata (Maybe Build) Source #

The build that the operation is tracking.

BuildOptions

data BuildOptions Source #

Optional arguments to enable specific features of builds.

See: buildOptions smart constructor.

Instances
Eq BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildOptions -> Constr #

dataTypeOf :: BuildOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildOptions :: Type -> Type #

ToJSON BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildOptions Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildOptions = D1 (MetaData "BuildOptions" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "BuildOptions'" PrefixI True) (((S1 (MetaSel (Just "_boDiskSizeGb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_boEnv") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_boSubstitutionOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptionsSubstitutionOption)) :*: (S1 (MetaSel (Just "_boRequestedVerifyOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptionsRequestedVerifyOption)) :*: S1 (MetaSel (Just "_boWorkerPool") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_boMachineType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptionsMachineType)) :*: (S1 (MetaSel (Just "_boSecretEnv") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_boVolumes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Volume])))) :*: (S1 (MetaSel (Just "_boLogStreamingOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptionsLogStreamingOption)) :*: (S1 (MetaSel (Just "_boLogging") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptionsLogging)) :*: S1 (MetaSel (Just "_boSourceProvenanceHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))))

buildOptions :: BuildOptions Source #

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

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

boDiskSizeGb :: Lens' BuildOptions (Maybe Int64) Source #

Requested disk size for the VM that runs the build. Note that this is *NOT* "disk free"; some of the space will be used by the operating system and build utilities. Also note that this is the minimum disk size that will be allocated for the build -- the build may run with a larger disk than requested. At present, the maximum disk size is 1000GB; builds that request more than the maximum are rejected with an error.

boEnv :: Lens' BuildOptions [Text] Source #

A list of global environment variable definitions that will exist for all build steps in this build. If a variable is defined in both globally and in a build step, the variable will use the build step value. The elements are of the form "KEY=VALUE" for the environment variable "KEY" being given the value "VALUE".

boSubstitutionOption :: Lens' BuildOptions (Maybe BuildOptionsSubstitutionOption) Source #

Option to specify behavior when there is an error in the substitution checks.

boWorkerPool :: Lens' BuildOptions (Maybe Text) Source #

Option to specify a `WorkerPool` for the build. User specifies the pool with the format "[WORKERPOOL_PROJECT_ID]/[WORKERPOOL_NAME]". This is an experimental field.

boMachineType :: Lens' BuildOptions (Maybe BuildOptionsMachineType) Source #

Compute Engine machine type on which to run the build.

boSecretEnv :: Lens' BuildOptions [Text] Source #

A list of global environment variables, which are encrypted using a Cloud Key Management Service crypto key. These values must be specified in the build's `Secret`. These variables will be available to all build steps in this build.

boVolumes :: Lens' BuildOptions [Volume] Source #

Global list of volumes to mount for ALL build steps Each volume is created as an empty volume prior to starting the build process. Upon completion of the build, volumes and their contents are discarded. Global volume names and paths cannot conflict with the volumes defined a build step. Using a global volume in a build with only one step is not valid as it is indicative of a build request with an incorrect configuration.

boLogStreamingOption :: Lens' BuildOptions (Maybe BuildOptionsLogStreamingOption) Source #

Option to define build log streaming behavior to Google Cloud Storage.

boLogging :: Lens' BuildOptions (Maybe BuildOptionsLogging) Source #

Option to specify the logging mode, which determines where the logs are stored.

boSourceProvenanceHash :: Lens' BuildOptions [Text] Source #

Requested hash for SourceProvenance.

OperationResponse

data OperationResponse Source #

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

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: OperationResponse -> Constr #

dataTypeOf :: OperationResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

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

operationResponse Source #

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

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

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

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

BuildTrigger

data BuildTrigger Source #

Configuration for an automated build in response to source repository changes.

See: buildTrigger smart constructor.

Instances
Eq BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuildTrigger -> Constr #

dataTypeOf :: BuildTrigger -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuildTrigger :: Type -> Type #

ToJSON BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuildTrigger Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

buildTrigger :: BuildTrigger Source #

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

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

btSubstitutions :: Lens' BuildTrigger (Maybe BuildTriggerSubstitutions) Source #

Substitutions data for Build resource.

btIncludedFiles :: Lens' BuildTrigger [Text] Source #

If any of the files altered in the commit pass the ignored_files filter and included_files is empty, then as far as this filter is concerned, we should trigger the build. If any of the files altered in the commit pass the ignored_files filter and included_files is not empty, then we make sure that at least one of those files matches a included_files glob. If not, then we do not trigger a build.

btDisabled :: Lens' BuildTrigger (Maybe Bool) Source #

If true, the trigger will never result in a build.

btTriggerTemplate :: Lens' BuildTrigger (Maybe RepoSource) Source #

Template describing the types of source changes to trigger a build. Branch and tag names in trigger templates are interpreted as regular expressions. Any branch or tag change that matches that regular expression will trigger a build.

btBuild :: Lens' BuildTrigger (Maybe Build) Source #

Contents of the build template.

btIgnoredFiles :: Lens' BuildTrigger [Text] Source #

ignored_files and included_files are file glob matches using http://godoc/pkg/path/filepath#Match extended with support for "**". If ignored_files and changed files are both empty, then they are not used to determine whether or not to trigger a build. If ignored_files is not empty, then we ignore any files that match any of the ignored_file globs. If the change has no files that are outside of the ignored_files globs, then we do not trigger a build.

btId :: Lens' BuildTrigger (Maybe Text) Source #

Output only. Unique identifier of the trigger.

btDescription :: Lens' BuildTrigger (Maybe Text) Source #

Human-readable description of this trigger.

btFilename :: Lens' BuildTrigger (Maybe Text) Source #

Path, from the source root, to a file whose contents is used for the template.

btCreateTime :: Lens' BuildTrigger (Maybe UTCTime) Source #

Output only. Time when the trigger was created.

BuiltImage

data BuiltImage Source #

An image built by the pipeline.

See: builtImage smart constructor.

Instances
Eq BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Data BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Methods

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

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

toConstr :: BuiltImage -> Constr #

dataTypeOf :: BuiltImage -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Generic BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

Associated Types

type Rep BuiltImage :: Type -> Type #

ToJSON BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

FromJSON BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuiltImage Source # 
Instance details

Defined in Network.Google.ContainerBuilder.Types.Product

type Rep BuiltImage = D1 (MetaData "BuiltImage" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.4.0-4FzmtZeHoBN7v5WIesnfJp" False) (C1 (MetaCons "BuiltImage'" PrefixI True) (S1 (MetaSel (Just "_biPushTiming") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TimeSpan)) :*: (S1 (MetaSel (Just "_biName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_biDigest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

builtImage :: BuiltImage Source #

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

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

biPushTiming :: Lens' BuiltImage (Maybe TimeSpan) Source #

Output only. Stores timing information for pushing the specified image.

biName :: Lens' BuiltImage (Maybe Text) Source #

Name used to push the container image to Google Container Registry, as presented to `docker push`.

biDigest :: Lens' BuiltImage (Maybe Text) Source #

Docker Registry 2.0 digest.