gogol-containerbuilder-0.3.0: Google Cloud Container Builder 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.Types

Contents

Description

 

Synopsis

Service Configuration

containerBuilderService :: ServiceConfig Source #

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

BuildStep

data BuildStep Source #

BuildStep describes a step to perform in the build pipeline.

See: buildStep smart constructor.

Instances

Eq BuildStep Source # 
Data BuildStep Source # 

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

Associated Types

type Rep BuildStep :: * -> * #

ToJSON BuildStep Source # 
FromJSON BuildStep Source # 
type Rep BuildStep Source # 

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:

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

Working directory (relative to project source root) to use when running this operation's container.

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, these args will be used as arguments to that entrypoint. If the image does not define an entrypoint, the first element in args will be 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".

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

Optional entrypoint to be used instead of the build step image's default If unset, the image's default will be 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 #

The name of the container image that will run this particular build step. If the image is already 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). 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 #

Optional unique identifier for this build step, used in wait_for to reference this build step as a dependency.

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

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 # 
Generic SourceProvenance Source # 
ToJSON SourceProvenance Source # 
FromJSON SourceProvenance Source # 
type Rep SourceProvenance Source # 
type Rep SourceProvenance = D1 (MetaData "SourceProvenance" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "SourceProvenance'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_spResolvedRepoSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepoSource))) ((:*:) (S1 (MetaSel (Just Symbol "_spResolvedStorageSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StorageSource))) (S1 (MetaSel (Just Symbol "_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 #

Hash(es) of the build source, which can be used to verify that the original source integrity was maintained in the build. Note that FileHashes will only 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. 'OutputOnly

ListBuildsResponse

data ListBuildsResponse Source #

Response including listed builds.

See: listBuildsResponse smart constructor.

Instances

Eq ListBuildsResponse Source # 
Data ListBuildsResponse Source # 

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 # 
Generic ListBuildsResponse Source # 
ToJSON ListBuildsResponse Source # 
FromJSON ListBuildsResponse Source # 
type Rep ListBuildsResponse Source # 
type Rep ListBuildsResponse = D1 (MetaData "ListBuildsResponse" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "ListBuildsResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_lbrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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` which can be used for common error conditions. # Language mapping The `Status` message is the logical representation of the error model, but it is not necessarily the actual wire format. When the `Status` message is exposed in different client libraries and different wire protocols, it can be mapped differently. For example, it will likely be mapped to some exceptions in Java, but more likely mapped to some error codes in C. # Other uses The error model and the `Status` message can be used in a variety of environments, either with or without APIs, to provide a consistent developer experience across different environments. Example uses of this error model include: - Partial errors. If a service needs to return partial errors to the client, it may embed the `Status` in the normal response to indicate the partial errors. - Workflow errors. A typical workflow has multiple steps. Each step may have a `Status` message for error reporting purpose. - Batch operations. If a client uses batch request and batch response, the `Status` message should be used directly inside batch response, one for each error sub-response. - Asynchronous operations. If an API call embeds asynchronous operation results in its response, the status of those operations should be represented directly using the `Status` message. - Logging. If some API errors are stored in logs, the message `Status` could be used directly after any stripping needed for security/privacy reasons.

See: status smart constructor.

Instances

Eq Status Source # 

Methods

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

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

Data Status Source # 

Methods

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

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

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Status Source # 
Generic Status Source # 

Associated Types

type Rep Status :: * -> * #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
FromJSON Status Source # 
type Rep Status Source # 
type Rep Status = D1 (MetaData "Status" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "Status'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StatusDetailsItem]))) ((:*:) (S1 (MetaSel (Just Symbol "_sCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_sMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

status :: Status Source #

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

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

sDetails :: Lens' Status [StatusDetailsItem] Source #

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

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

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

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

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

ListOperationsResponse

data ListOperationsResponse Source #

The response message for Operations.ListOperations.

See: listOperationsResponse smart constructor.

Instances

Eq ListOperationsResponse Source # 
Data ListOperationsResponse Source # 

Methods

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

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

toConstr :: ListOperationsResponse -> Constr #

dataTypeOf :: ListOperationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListOperationsResponse Source # 
Generic ListOperationsResponse Source # 
ToJSON ListOperationsResponse Source # 
FromJSON ListOperationsResponse Source # 
type Rep ListOperationsResponse Source # 
type Rep ListOperationsResponse = D1 (MetaData "ListOperationsResponse" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "ListOperationsResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_lorNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_lorOperations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Operation])))))

listOperationsResponse :: ListOperationsResponse Source #

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

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

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

The standard List next-page token.

lorOperations :: Lens' ListOperationsResponse [Operation] Source #

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

CancelOperationRequest

data CancelOperationRequest Source #

The request message for Operations.CancelOperation.

See: cancelOperationRequest smart constructor.

Instances

Eq CancelOperationRequest Source # 
Data CancelOperationRequest Source # 

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 # 
Generic CancelOperationRequest Source # 
ToJSON CancelOperationRequest Source # 
FromJSON CancelOperationRequest Source # 
type Rep CancelOperationRequest Source # 
type Rep CancelOperationRequest = D1 (MetaData "CancelOperationRequest" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "CancelOperationRequest'" PrefixI False) U1)

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 # 

Methods

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

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

Data Hash Source # 

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 # 

Methods

showsPrec :: Int -> Hash -> ShowS #

show :: Hash -> String #

showList :: [Hash] -> ShowS #

Generic Hash Source # 

Associated Types

type Rep Hash :: * -> * #

Methods

from :: Hash -> Rep Hash x #

to :: Rep Hash x -> Hash #

ToJSON Hash Source # 
FromJSON Hash Source # 
type Rep Hash Source # 
type Rep Hash = D1 (MetaData "Hash" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "Hash'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_hValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) (S1 (MetaSel (Just Symbol "_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 #

Results describes the artifacts created by the build pipeline.

See: results smart constructor.

Instances

Eq Results Source # 

Methods

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

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

Data Results Source # 

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

Associated Types

type Rep Results :: * -> * #

Methods

from :: Results -> Rep Results x #

to :: Rep Results x -> Results #

ToJSON Results Source # 
FromJSON Results Source # 
type Rep Results Source # 
type Rep Results = D1 (MetaData "Results" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "Results'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_rImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuiltImage]))) (S1 (MetaSel (Just Symbol "_rBuildStepImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

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 #

Images that were built as a part of the build.

rBuildStepImages :: Lens' Results [Text] Source #

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

RepoSource

data RepoSource Source #

RepoSource describes the location of the source in a Google Cloud Source Repository.

See: repoSource smart constructor.

Instances

Eq RepoSource Source # 
Data RepoSource Source # 

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

Associated Types

type Rep RepoSource :: * -> * #

ToJSON RepoSource Source # 
FromJSON RepoSource Source # 
type Rep RepoSource Source # 
type Rep RepoSource = D1 (MetaData "RepoSource" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "RepoSource'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_rsRepoName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_rsCommitSha") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_rsBranchName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_rsTagName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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 repo. If omitted, the name "default" is assumed.

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

Methods

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

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

toConstr :: Operation -> Constr #

dataTypeOf :: Operation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Operation Source # 
Generic Operation Source # 

Associated Types

type Rep Operation :: * -> * #

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

operation :: Operation Source #

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

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

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

If the value is `false`, it means the operation is still in progress. If true, the operation is completed, and 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 # 

Methods

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

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

Data Empty Source # 

Methods

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

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

toConstr :: Empty -> Constr #

dataTypeOf :: Empty -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Empty Source # 

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 

Associated Types

type Rep Empty :: * -> * #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
FromJSON Empty Source # 
type Rep Empty Source # 
type Rep Empty = D1 (MetaData "Empty" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "Empty'" PrefixI False) U1)

empty :: Empty Source #

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

StatusDetailsItem

data StatusDetailsItem Source #

Instances

Eq StatusDetailsItem Source # 
Data StatusDetailsItem Source # 

Methods

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

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

toConstr :: StatusDetailsItem -> Constr #

dataTypeOf :: StatusDetailsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StatusDetailsItem Source # 
Generic StatusDetailsItem Source # 
ToJSON StatusDetailsItem Source # 
FromJSON StatusDetailsItem Source # 
type Rep StatusDetailsItem Source # 
type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "StatusDetailsItem'" PrefixI True) (S1 (MetaSel (Just Symbol "_sdiAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

statusDetailsItem Source #

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

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

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

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

Build

data Build Source #

Instances

Eq Build Source # 

Methods

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

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

Data Build Source # 

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 # 

Methods

showsPrec :: Int -> Build -> ShowS #

show :: Build -> String #

showList :: [Build] -> ShowS #

Generic Build Source # 

Associated Types

type Rep Build :: * -> * #

Methods

from :: Build -> Rep Build x #

to :: Rep Build x -> Build #

ToJSON Build Source # 
FromJSON Build Source # 
type Rep Build Source # 
type Rep Build = D1 (MetaData "Build" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "Build'" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bImages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_bStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildStatus)))) ((:*:) (S1 (MetaSel (Just Symbol "_bSourceProvenance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SourceProvenance))) (S1 (MetaSel (Just Symbol "_bLogURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bResults") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Results))) (S1 (MetaSel (Just Symbol "_bStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))) ((:*:) (S1 (MetaSel (Just Symbol "_bLogsBucket") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bSteps") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BuildStep])))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bStatusDetail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Source)))) ((:*:) (S1 (MetaSel (Just Symbol "_bId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bOptions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptions))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bBuildTriggerId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_bTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Duration))) ((:*:) (S1 (MetaSel (Just Symbol "_bFinishTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) (S1 (MetaSel (Just Symbol "_bCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))))))))

build :: Build Source #

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

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

bImages :: Lens' Build [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.

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

Status of the build. 'OutputOnly

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

A permanent fixed identifier for source. 'OutputOnly

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

URL to logs for this build in Google Cloud Logging. 'OutputOnly

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

Results of the build. 'OutputOnly

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

Time at which execution of the build was started. 'OutputOnly

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 #

Describes the operations to be performed on the workspace.

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

Customer-readable message about the current status. 'OutputOnly

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

Describes where to find the source files to build.

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

Unique identifier of the build. 'OutputOnly

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

Special options for this build.

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

ID of the project. 'OutputOnly.

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

The ID of the BuildTrigger that triggered this build, if it was triggered automatically. 'OutputOnly

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 #

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. 'OutputOnly

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

Time at which the request to create the build was received. 'OutputOnly

SourceProvenanceFileHashes

data SourceProvenanceFileHashes Source #

Hash(es) of the build source, which can be used to verify that the original source integrity was maintained in the build. Note that FileHashes will only 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. 'OutputOnly

See: sourceProvenanceFileHashes smart constructor.

Instances

Eq SourceProvenanceFileHashes Source # 
Data SourceProvenanceFileHashes Source # 

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 # 
Generic SourceProvenanceFileHashes Source # 
ToJSON SourceProvenanceFileHashes Source # 
FromJSON SourceProvenanceFileHashes Source # 
type Rep SourceProvenanceFileHashes Source # 
type Rep SourceProvenanceFileHashes = D1 (MetaData "SourceProvenanceFileHashes" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "SourceProvenanceFileHashes'" PrefixI True) (S1 (MetaSel (Just Symbol "_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:

CancelBuildRequest

data CancelBuildRequest Source #

Request to cancel an ongoing build.

See: cancelBuildRequest smart constructor.

Instances

Eq CancelBuildRequest Source # 
Data CancelBuildRequest Source # 

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 # 
Generic CancelBuildRequest Source # 
ToJSON CancelBuildRequest Source # 
FromJSON CancelBuildRequest Source # 
type Rep CancelBuildRequest Source # 
type Rep CancelBuildRequest = D1 (MetaData "CancelBuildRequest" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "CancelBuildRequest'" PrefixI False) U1)

cancelBuildRequest :: CancelBuildRequest Source #

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

StorageSource

data StorageSource Source #

StorageSource describes the location of the source in an archive file in Google Cloud Storage.

See: storageSource smart constructor.

Instances

Eq StorageSource Source # 
Data StorageSource Source # 

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

Associated Types

type Rep StorageSource :: * -> * #

ToJSON StorageSource Source # 
FromJSON StorageSource Source # 
type Rep StorageSource Source # 
type Rep StorageSource = D1 (MetaData "StorageSource" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "StorageSource'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_ssBucket") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_ssObject") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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 source (see Bucket Name Requirements).

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

Google Cloud Storage object containing 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 # 
Data ListBuildTriggersResponse Source # 

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 # 
Generic ListBuildTriggersResponse Source # 
ToJSON ListBuildTriggersResponse Source # 
FromJSON ListBuildTriggersResponse Source # 
type Rep ListBuildTriggersResponse Source # 
type Rep ListBuildTriggersResponse = D1 (MetaData "ListBuildTriggersResponse" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "ListBuildTriggersResponse'" PrefixI True) (S1 (MetaSel (Just Symbol "_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.

BuildOptionsRequestedVerifyOption

data BuildOptionsRequestedVerifyOption Source #

Requested verifiability options.

Constructors

NotVerified

NOT_VERIFIED Not a verifiable build. (default)

Verified

VERIFIED Verified build.

Instances

Enum BuildOptionsRequestedVerifyOption Source # 
Eq BuildOptionsRequestedVerifyOption Source # 
Data BuildOptionsRequestedVerifyOption Source # 

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 # 
Read BuildOptionsRequestedVerifyOption Source # 
Show BuildOptionsRequestedVerifyOption Source # 
Generic BuildOptionsRequestedVerifyOption Source # 
Hashable BuildOptionsRequestedVerifyOption Source # 
ToJSON BuildOptionsRequestedVerifyOption Source # 
FromJSON BuildOptionsRequestedVerifyOption Source # 
FromHttpApiData BuildOptionsRequestedVerifyOption Source # 
ToHttpApiData BuildOptionsRequestedVerifyOption Source # 
type Rep BuildOptionsRequestedVerifyOption Source # 
type Rep BuildOptionsRequestedVerifyOption = D1 (MetaData "BuildOptionsRequestedVerifyOption" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) ((:+:) (C1 (MetaCons "NotVerified" PrefixI False) U1) (C1 (MetaCons "Verified" PrefixI False) U1))

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

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

Associated Types

type Rep FileHashes :: * -> * #

ToJSON FileHashes Source # 
FromJSON FileHashes Source # 
type Rep FileHashes Source # 
type Rep FileHashes = D1 (MetaData "FileHashes" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "FileHashes'" PrefixI True) (S1 (MetaSel (Just Symbol "_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.

Xgafv

data Xgafv Source #

V1 error format.

Constructors

X1

1 v1 error format

X2

2 v2 error format

Instances

Enum Xgafv Source # 
Eq Xgafv Source # 

Methods

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

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

Data Xgafv Source # 

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 # 

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 # 
Show Xgafv Source # 

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 

Associated Types

type Rep Xgafv :: * -> * #

Methods

from :: Xgafv -> Rep Xgafv x #

to :: Rep Xgafv x -> Xgafv #

Hashable Xgafv Source # 

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
FromJSON Xgafv Source # 
FromHttpApiData Xgafv Source # 
ToHttpApiData Xgafv Source # 
type Rep Xgafv Source # 
type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) ((:+:) (C1 (MetaCons "X1" PrefixI False) U1) (C1 (MetaCons "X2" PrefixI False) U1))

BuildStatus

data BuildStatus Source #

Status of the build. 'OutputOnly

Constructors

StatusUnknown

STATUS_UNKNOWN Status of the build is unknown.

Queued

QUEUED Build is queued; work has not yet begun.

Working

WORKING Build is being executed.

Success

SUCCESS Build finished successfully.

Failure

FAILURE Build failed to complete successfully.

InternalError

INTERNAL_ERROR Build failed due to an internal cause.

Timeout

TIMEOUT Build took longer than was allowed.

Cancelled

CANCELLED Build was canceled by a user.

Instances

Enum BuildStatus Source # 
Eq BuildStatus Source # 
Data BuildStatus Source # 

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 # 
Read BuildStatus Source # 
Show BuildStatus Source # 
Generic BuildStatus Source # 

Associated Types

type Rep BuildStatus :: * -> * #

Hashable BuildStatus Source # 
ToJSON BuildStatus Source # 
FromJSON BuildStatus Source # 
FromHttpApiData BuildStatus Source # 
ToHttpApiData BuildStatus Source # 
type Rep BuildStatus Source # 
type Rep BuildStatus = D1 (MetaData "BuildStatus" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "StatusUnknown" PrefixI False) U1) (C1 (MetaCons "Queued" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Working" PrefixI False) U1) (C1 (MetaCons "Success" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "Failure" PrefixI False) U1) (C1 (MetaCons "InternalError" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Timeout" PrefixI False) U1) (C1 (MetaCons "Cancelled" PrefixI False) U1))))

HashType

data HashType Source #

The type of hash that was performed.

Constructors

None

NONE No hash requested.

SHA256

SHA256 Use a sha256 hash.

Instances

Enum HashType Source # 
Eq HashType Source # 
Data HashType Source # 

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 # 
Read HashType Source # 
Show HashType Source # 
Generic HashType Source # 

Associated Types

type Rep HashType :: * -> * #

Methods

from :: HashType -> Rep HashType x #

to :: Rep HashType x -> HashType #

Hashable HashType Source # 

Methods

hashWithSalt :: Int -> HashType -> Int #

hash :: HashType -> Int #

ToJSON HashType Source # 
FromJSON HashType Source # 
FromHttpApiData HashType Source # 
ToHttpApiData HashType Source # 
type Rep HashType Source # 
type Rep HashType = D1 (MetaData "HashType" "Network.Google.ContainerBuilder.Types.Sum" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) ((:+:) (C1 (MetaCons "None" PrefixI False) U1) (C1 (MetaCons "SHA256" PrefixI False) U1))

Source

data Source Source #

Source describes the location of the source in a supported storage service.

See: source smart constructor.

Instances

Eq Source Source # 

Methods

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

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

Data Source Source # 

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

Associated Types

type Rep Source :: * -> * #

Methods

from :: Source -> Rep Source x #

to :: Rep Source x -> Source #

ToJSON Source Source # 
FromJSON Source Source # 
type Rep Source Source # 
type Rep Source = D1 (MetaData "Source" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "Source'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sRepoSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepoSource))) (S1 (MetaSel (Just Symbol "_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 source from this location in a Cloud Repo.

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

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

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

Methods

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

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

toConstr :: OperationMetadata -> Constr #

dataTypeOf :: OperationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadata Source # 
Generic OperationMetadata Source # 
ToJSON OperationMetadata Source # 
FromJSON OperationMetadata Source # 
type Rep OperationMetadata Source # 
type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "OperationMetadata'" PrefixI True) (S1 (MetaSel (Just Symbol "_omAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadata Source #

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

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

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

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

BuildOperationMetadata

data BuildOperationMetadata Source #

Metadata for build operations.

See: buildOperationMetadata smart constructor.

Instances

Eq BuildOperationMetadata Source # 
Data BuildOperationMetadata Source # 

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 # 
Generic BuildOperationMetadata Source # 
ToJSON BuildOperationMetadata Source # 
FromJSON BuildOperationMetadata Source # 
type Rep BuildOperationMetadata Source # 
type Rep BuildOperationMetadata = D1 (MetaData "BuildOperationMetadata" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "BuildOperationMetadata'" PrefixI True) (S1 (MetaSel (Just Symbol "_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 # 
Data BuildOptions Source # 

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

Associated Types

type Rep BuildOptions :: * -> * #

ToJSON BuildOptions Source # 
FromJSON BuildOptions Source # 
type Rep BuildOptions Source # 
type Rep BuildOptions = D1 (MetaData "BuildOptions" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "BuildOptions'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_boRequestedVerifyOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BuildOptionsRequestedVerifyOption))) (S1 (MetaSel (Just Symbol "_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:

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

Methods

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

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

toConstr :: OperationResponse -> Constr #

dataTypeOf :: OperationResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationResponse Source # 
Generic OperationResponse Source # 
ToJSON OperationResponse Source # 
FromJSON OperationResponse Source # 
type Rep OperationResponse Source # 
type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" True) (C1 (MetaCons "OperationResponse'" PrefixI True) (S1 (MetaSel (Just Symbol "_orAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationResponse Source #

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

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

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

Properties of the object. Contains field '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 # 
Data BuildTrigger Source # 

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

Associated Types

type Rep BuildTrigger :: * -> * #

ToJSON BuildTrigger Source # 
FromJSON BuildTrigger Source # 
type Rep BuildTrigger Source # 

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:

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.

btId :: Lens' BuildTrigger (Maybe Text) Source #

Unique identifier of the trigger. 'OutputOnly

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 #

Time when the trigger was created. 'OutputOnly

BuiltImage

data BuiltImage Source #

BuiltImage describes an image built by the pipeline.

See: builtImage smart constructor.

Instances

Eq BuiltImage Source # 
Data BuiltImage Source # 

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

Associated Types

type Rep BuiltImage :: * -> * #

ToJSON BuiltImage Source # 
FromJSON BuiltImage Source # 
type Rep BuiltImage Source # 
type Rep BuiltImage = D1 (MetaData "BuiltImage" "Network.Google.ContainerBuilder.Types.Product" "gogol-containerbuilder-0.3.0-70uR9dPskeb8lCu5XZD2nx" False) (C1 (MetaCons "BuiltImage'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_biName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_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:

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.