gogol-cloudfunctions-0.4.0: Google Cloud Functions 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.CloudFunctions.Types

Contents

Description

 
Synopsis

Service Configuration

cloudFunctionsService :: ServiceConfig Source #

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

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.CloudFunctions.Types.Product

Methods

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

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

Data Status Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

Generic Status Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

FromJSON Status Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" 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.

AuditConfig

data AuditConfig Source #

Specifies the audit configuration for a service. The configuration determines which permission types are logged, and what identities, if any, are exempted from logging. An AuditConfig must have one or more AuditLogConfigs. If there are AuditConfigs for both `allServices` and a specific service, the union of the two AuditConfigs is used for that service: the log_types specified in each AuditConfig are enabled, and the exempted_members in each AuditLogConfig are exempted. Example Policy with multiple AuditConfigs: { "audit_configs": [ { "service": "allServices" "audit_log_configs": [ { "log_type": "DATA_READ", "exempted_members": [ "user:foo'gmail.com" ] }, { "log_type": "DATA_WRITE", }, { "log_type": "ADMIN_READ", } ] }, { "service": "fooservice.googleapis.com" "audit_log_configs": [ { "log_type": "DATA_READ", }, { "log_type": "DATA_WRITE", "exempted_members": [ "user:bar'gmail.com" ] } ] } ] } For fooservice, this policy enables DATA_READ, DATA_WRITE and ADMIN_READ logging. It also exempts foo'gmail.com from DATA_READ logging, and bar'gmail.com from DATA_WRITE logging.

See: auditConfig smart constructor.

Instances
Eq AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: AuditConfig -> Constr #

dataTypeOf :: AuditConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep AuditConfig :: Type -> Type #

ToJSON AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep AuditConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep AuditConfig = D1 (MetaData "AuditConfig" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "AuditConfig'" PrefixI True) (S1 (MetaSel (Just "_acService") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_acAuditLogConfigs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AuditLogConfig]))))

auditConfig :: AuditConfig Source #

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

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

acService :: Lens' AuditConfig (Maybe Text) Source #

Specifies a service that will be enabled for audit logging. For example, `storage.googleapis.com`, `cloudsql.googleapis.com`. `allServices` is a special value that covers all services.

acAuditLogConfigs :: Lens' AuditConfig [AuditLogConfig] Source #

The configuration for logging of each type of permission.

OperationMetadataV1Type

data OperationMetadataV1Type Source #

Type of operation.

Constructors

OperationUnspecified

OPERATION_UNSPECIFIED Unknown operation type.

CreateFunction

CREATE_FUNCTION Triggered by CreateFunction call

UpdateFunction

UPDATE_FUNCTION Triggered by UpdateFunction call

DeleteFunction

DELETE_FUNCTION Triggered by DeleteFunction call.

Instances
Enum OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Eq OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Data OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Methods

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

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

toConstr :: OperationMetadataV1Type -> Constr #

dataTypeOf :: OperationMetadataV1Type -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Read OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Show OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Generic OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Associated Types

type Rep OperationMetadataV1Type :: Type -> Type #

Hashable OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToJSON OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromJSON OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromHttpApiData OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToHttpApiData OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep OperationMetadataV1Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep OperationMetadataV1Type = D1 (MetaData "OperationMetadataV1Type" "Network.Google.CloudFunctions.Types.Sum" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) ((C1 (MetaCons "OperationUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CreateFunction" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "UpdateFunction" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DeleteFunction" PrefixI False) (U1 :: Type -> Type)))

OperationMetadataV1Beta2

data OperationMetadataV1Beta2 Source #

Metadata describing an Operation

See: operationMetadataV1Beta2 smart constructor.

Instances
Eq OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: OperationMetadataV1Beta2 -> Constr #

dataTypeOf :: OperationMetadataV1Beta2 -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep OperationMetadataV1Beta2 :: Type -> Type #

ToJSON OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1Beta2 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1Beta2 = D1 (MetaData "OperationMetadataV1Beta2" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "OperationMetadataV1Beta2'" PrefixI True) ((S1 (MetaSel (Just "_omvbVersionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_omvbUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) :*: (S1 (MetaSel (Just "_omvbType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationMetadataV1Beta2Type)) :*: (S1 (MetaSel (Just "_omvbTarget") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_omvbRequest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationMetadataV1Beta2Request))))))

operationMetadataV1Beta2 :: OperationMetadataV1Beta2 Source #

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

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

omvbVersionId :: Lens' OperationMetadataV1Beta2 (Maybe Int64) Source #

Version id of the function created or updated by an API call. This field is only populated for Create and Update operations.

omvbUpdateTime :: Lens' OperationMetadataV1Beta2 (Maybe UTCTime) Source #

The last update timestamp of the operation.

omvbTarget :: Lens' OperationMetadataV1Beta2 (Maybe Text) Source #

Target of the operation - for example projects/project-1/locations/region-1/functions/function-1

omvbRequest :: Lens' OperationMetadataV1Beta2 (Maybe OperationMetadataV1Beta2Request) Source #

The original request that started the operation.

Expr

data Expr Source #

Represents an expression text. Example: title: "User account presence" description: "Determines whether the request has a user account" expression: "size(request.user) > 0"

See: expr smart constructor.

Instances
Eq Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

Data Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: Expr -> Constr #

dataTypeOf :: Expr -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Generic Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep Expr :: Type -> Type #

Methods

from :: Expr -> Rep Expr x #

to :: Rep Expr x -> Expr #

ToJSON Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Expr Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Expr = D1 (MetaData "Expr" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "Expr'" PrefixI True) ((S1 (MetaSel (Just "_eLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eExpression") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_eTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_eDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

expr :: Expr Source #

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

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

eLocation :: Lens' Expr (Maybe Text) Source #

An optional string indicating the location of the expression for error reporting, e.g. a file name and a position in the file.

eExpression :: Lens' Expr (Maybe Text) Source #

Textual representation of an expression in Common Expression Language syntax. The application context of the containing message determines which well-known feature set of CEL is supported.

eTitle :: Lens' Expr (Maybe Text) Source #

An optional title for the expression, i.e. a short string describing its purpose. This can be used e.g. in UIs which allow to enter the expression.

eDescription :: Lens' Expr (Maybe Text) Source #

An optional description of the expression. This is a longer text which describes the expression, e.g. when hovered over it in a UI.

ListLocationsResponse

data ListLocationsResponse Source #

The response message for Locations.ListLocations.

See: listLocationsResponse smart constructor.

Instances
Eq ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: ListLocationsResponse -> Constr #

dataTypeOf :: ListLocationsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep ListLocationsResponse :: Type -> Type #

ToJSON ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep ListLocationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep ListLocationsResponse = D1 (MetaData "ListLocationsResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "ListLocationsResponse'" PrefixI True) (S1 (MetaSel (Just "_llrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_llrLocations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Location]))))

listLocationsResponse :: ListLocationsResponse Source #

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

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

llrNextPageToken :: Lens' ListLocationsResponse (Maybe Text) Source #

The standard List next-page token.

llrLocations :: Lens' ListLocationsResponse [Location] Source #

A list of locations that matches the specified filter in the 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.CloudFunctions.Types.Product

Data ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

Generic ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep ListOperationsResponse :: Type -> Type #

ToJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep ListOperationsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep ListOperationsResponse = D1 (MetaData "ListOperationsResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" 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.

GenerateUploadURLRequest

data GenerateUploadURLRequest Source #

Request of `GenerateSourceUploadUrl` method.

See: generateUploadURLRequest smart constructor.

Instances
Eq GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: GenerateUploadURLRequest -> Constr #

dataTypeOf :: GenerateUploadURLRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep GenerateUploadURLRequest :: Type -> Type #

ToJSON GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateUploadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateUploadURLRequest = D1 (MetaData "GenerateUploadURLRequest" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "GenerateUploadURLRequest'" PrefixI False) (U1 :: Type -> Type))

generateUploadURLRequest :: GenerateUploadURLRequest Source #

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

Location

data Location Source #

A resource that represents Google Cloud Platform location.

See: location smart constructor.

Instances
Eq Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: Location -> Constr #

dataTypeOf :: Location -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep Location :: Type -> Type #

Methods

from :: Location -> Rep Location x #

to :: Rep Location x -> Location #

ToJSON Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Location Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Location = D1 (MetaData "Location" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "Location'" PrefixI True) ((S1 (MetaSel (Just "_lName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LocationMetadata))) :*: (S1 (MetaSel (Just "_lDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_lLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LocationLabels)) :*: S1 (MetaSel (Just "_lLocationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

location :: Location Source #

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

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

lName :: Lens' Location (Maybe Text) Source #

Resource name for the location, which may vary between implementations. For example: `"projects/example-project/locations/us-east1"`

lMetadata :: Lens' Location (Maybe LocationMetadata) Source #

Service-specific metadata. For example the available capacity at the given location.

lDisplayName :: Lens' Location (Maybe Text) Source #

The friendly name for this location, typically a nearby city name. For example, "Tokyo".

lLabels :: Lens' Location (Maybe LocationLabels) Source #

Cross-service attributes for the location. For example {"cloud.googleapis.com/region": "us-east1"}

lLocationId :: Lens' Location (Maybe Text) Source #

The canonical id for this location. For example: `"us-east1"`.

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.CloudFunctions.Types.Product

Data Operation Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

Generic Operation Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

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.

GenerateDownloadURLRequest

data GenerateDownloadURLRequest Source #

Request of `GenerateDownloadUrl` method.

See: generateDownloadURLRequest smart constructor.

Instances
Eq GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: GenerateDownloadURLRequest -> Constr #

dataTypeOf :: GenerateDownloadURLRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep GenerateDownloadURLRequest :: Type -> Type #

ToJSON GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateDownloadURLRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateDownloadURLRequest = D1 (MetaData "GenerateDownloadURLRequest" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "GenerateDownloadURLRequest'" PrefixI True) (S1 (MetaSel (Just "_gdurVersionId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Word64)))))

generateDownloadURLRequest :: GenerateDownloadURLRequest Source #

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

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

gdurVersionId :: Lens' GenerateDownloadURLRequest (Maybe Word64) Source #

The optional version of function. If not set, default, current version is used.

Retry

data Retry Source #

Describes the retry policy in case of function's execution failure. A function execution will be retried on any failure. A failed execution will be retried up to 7 days with an exponential backoff (capped at 10 seconds). Retried execution is charged as any other execution.

See: retry smart constructor.

Instances
Eq Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

Data Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: Retry -> Constr #

dataTypeOf :: Retry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

showsPrec :: Int -> Retry -> ShowS #

show :: Retry -> String #

showList :: [Retry] -> ShowS #

Generic Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep Retry :: Type -> Type #

Methods

from :: Retry -> Rep Retry x #

to :: Rep Retry x -> Retry #

ToJSON Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Retry Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Retry = D1 (MetaData "Retry" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "Retry'" PrefixI False) (U1 :: Type -> Type))

retry :: Retry Source #

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

GenerateUploadURLResponse

data GenerateUploadURLResponse Source #

Response of `GenerateSourceUploadUrl` method.

See: generateUploadURLResponse smart constructor.

Instances
Eq GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: GenerateUploadURLResponse -> Constr #

dataTypeOf :: GenerateUploadURLResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep GenerateUploadURLResponse :: Type -> Type #

ToJSON GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateUploadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateUploadURLResponse = D1 (MetaData "GenerateUploadURLResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "GenerateUploadURLResponse'" PrefixI True) (S1 (MetaSel (Just "_guurUploadURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

generateUploadURLResponse :: GenerateUploadURLResponse Source #

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

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

guurUploadURL :: Lens' GenerateUploadURLResponse (Maybe Text) Source #

The generated Google Cloud Storage signed URL that should be used for a function source code upload. The uploaded file should be a zip archive which contains a function.

FailurePolicy

data FailurePolicy Source #

Describes the policy in case of function's execution failure. If empty, then defaults to ignoring failures (i.e. not retrying them).

See: failurePolicy smart constructor.

Instances
Eq FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: FailurePolicy -> Constr #

dataTypeOf :: FailurePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep FailurePolicy :: Type -> Type #

ToJSON FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep FailurePolicy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep FailurePolicy = D1 (MetaData "FailurePolicy" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "FailurePolicy'" PrefixI True) (S1 (MetaSel (Just "_fpRetry") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Retry))))

failurePolicy :: FailurePolicy Source #

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

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

fpRetry :: Lens' FailurePolicy (Maybe Retry) Source #

If specified, then the function will be retried in case of a failure.

CallFunctionResponse

data CallFunctionResponse Source #

Response of `CallFunction` method.

See: callFunctionResponse smart constructor.

Instances
Eq CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: CallFunctionResponse -> Constr #

dataTypeOf :: CallFunctionResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep CallFunctionResponse :: Type -> Type #

ToJSON CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CallFunctionResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CallFunctionResponse = D1 (MetaData "CallFunctionResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "CallFunctionResponse'" PrefixI True) (S1 (MetaSel (Just "_cfrExecutionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cfrError") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cfrResult") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

callFunctionResponse :: CallFunctionResponse Source #

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

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

cfrExecutionId :: Lens' CallFunctionResponse (Maybe Text) Source #

Execution id of function invocation.

cfrError :: Lens' CallFunctionResponse (Maybe Text) Source #

Either system or user-function generated error. Set if execution was not successful.

cfrResult :: Lens' CallFunctionResponse (Maybe Text) Source #

Result populated for successful execution of synchronous function. Will not be populated if function does not return a result through context.

HTTPSTrigger

data HTTPSTrigger Source #

Describes HttpsTrigger, could be used to connect web hooks to function.

See: httpsTrigger smart constructor.

Instances
Eq HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: HTTPSTrigger -> Constr #

dataTypeOf :: HTTPSTrigger -> DataType #

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

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

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

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

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

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

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

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

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

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

Show HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep HTTPSTrigger :: Type -> Type #

ToJSON HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep HTTPSTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep HTTPSTrigger = D1 (MetaData "HTTPSTrigger" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "HTTPSTrigger'" PrefixI True) (S1 (MetaSel (Just "_htURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

httpsTrigger :: HTTPSTrigger Source #

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

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

htURL :: Lens' HTTPSTrigger (Maybe Text) Source #

Output only. The deployed url for the function.

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" 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.

CloudFunctionEnvironmentVariables

data CloudFunctionEnvironmentVariables Source #

Environment variables that shall be available during function execution.

See: cloudFunctionEnvironmentVariables smart constructor.

Instances
Eq CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: CloudFunctionEnvironmentVariables -> Constr #

dataTypeOf :: CloudFunctionEnvironmentVariables -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep CloudFunctionEnvironmentVariables :: Type -> Type #

ToJSON CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CloudFunctionEnvironmentVariables Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CloudFunctionEnvironmentVariables = D1 (MetaData "CloudFunctionEnvironmentVariables" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "CloudFunctionEnvironmentVariables'" PrefixI True) (S1 (MetaSel (Just "_cfevAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

cloudFunctionEnvironmentVariables Source #

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

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

OperationMetadataV1Request

data OperationMetadataV1Request Source #

The original request that started the operation.

See: operationMetadataV1Request smart constructor.

Instances
Eq OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: OperationMetadataV1Request -> Constr #

dataTypeOf :: OperationMetadataV1Request -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep OperationMetadataV1Request :: Type -> Type #

ToJSON OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1Request = D1 (MetaData "OperationMetadataV1Request" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "OperationMetadataV1Request'" PrefixI True) (S1 (MetaSel (Just "_omvrAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadataV1Request Source #

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

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

omvrAddtional :: Lens' OperationMetadataV1Request (HashMap Text JSONValue) Source #

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

SetIAMPolicyRequest

data SetIAMPolicyRequest Source #

Request message for `SetIamPolicy` method.

See: setIAMPolicyRequest smart constructor.

Instances
Eq SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: SetIAMPolicyRequest -> Constr #

dataTypeOf :: SetIAMPolicyRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep SetIAMPolicyRequest :: Type -> Type #

ToJSON SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep SetIAMPolicyRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep SetIAMPolicyRequest = D1 (MetaData "SetIAMPolicyRequest" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "SetIAMPolicyRequest'" PrefixI True) (S1 (MetaSel (Just "_siprUpdateMask") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)) :*: S1 (MetaSel (Just "_siprPolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Policy))))

setIAMPolicyRequest :: SetIAMPolicyRequest Source #

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

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

siprUpdateMask :: Lens' SetIAMPolicyRequest (Maybe GFieldMask) Source #

OPTIONAL: A FieldMask specifying which fields of the policy to modify. Only the fields in the mask will be modified. If no mask is provided, the following default mask is used: paths: "bindings, etag" This field is only used by Cloud IAM.

siprPolicy :: Lens' SetIAMPolicyRequest (Maybe Policy) Source #

REQUIRED: The complete policy to be applied to the `resource`. The size of the policy is limited to a few 10s of KB. An empty policy is a valid policy but certain Cloud Platform services (such as Projects) might reject them.

EventTrigger

data EventTrigger Source #

Describes EventTrigger, used to request events be sent from another service.

See: eventTrigger smart constructor.

Instances
Eq EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: EventTrigger -> Constr #

dataTypeOf :: EventTrigger -> DataType #

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

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

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

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

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

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

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

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

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

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

Show EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep EventTrigger :: Type -> Type #

ToJSON EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep EventTrigger Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep EventTrigger = D1 (MetaData "EventTrigger" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "EventTrigger'" PrefixI True) ((S1 (MetaSel (Just "_etService") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_etFailurePolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FailurePolicy))) :*: (S1 (MetaSel (Just "_etEventType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_etResource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

eventTrigger :: EventTrigger Source #

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

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

etService :: Lens' EventTrigger (Maybe Text) Source #

The hostname of the service that should be observed. If no string is provided, the default service implementing the API will be used. For example, `storage.googleapis.com` is the default for all event types in the `google.storage` namespace.

etFailurePolicy :: Lens' EventTrigger (Maybe FailurePolicy) Source #

Specifies policy for failed executions.

etEventType :: Lens' EventTrigger (Maybe Text) Source #

Required. The type of event to observe. For example: `providers/cloud.storage/eventTypes/object.change` and `providers/cloud.pubsub/eventTypes/topic.publish`. Event types match pattern `providers/*/eventTypes/*.*`. The pattern contains: 1. namespace: For example, `cloud.storage` and `google.firebase.analytics`. 2. resource type: The type of resource on which event occurs. For example, the Google Cloud Storage API includes the type `object`. 3. action: The action that generates the event. For example, action for a Google Cloud Storage Object is 'change'. These parts are lower case.

etResource :: Lens' EventTrigger (Maybe Text) Source #

Required. The resource(s) from which to observe events, for example, `projects/_/buckets/myBucket`. Not all syntactically correct values are accepted by all services. For example: 1. The authorization model must support it. Google Cloud Functions only allows EventTriggers to be deployed that observe resources in the same project as the `CloudFunction`. 2. The resource type must match the pattern expected for an `event_type`. For example, an `EventTrigger` that has an `event_type` of "google.pubsub.topic.publish" should have a resource that matches Google Cloud Pub/Sub topics. Additionally, some services may support short names when creating an `EventTrigger`. These will always be returned in the normalized "long" format. See each *service's* documentation for supported formats.

SourceRepository

data SourceRepository Source #

Describes SourceRepository, used to represent parameters related to source repository where a function is hosted.

See: sourceRepository smart constructor.

Instances
Eq SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: SourceRepository -> Constr #

dataTypeOf :: SourceRepository -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep SourceRepository :: Type -> Type #

ToJSON SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep SourceRepository Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep SourceRepository = D1 (MetaData "SourceRepository" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "SourceRepository'" PrefixI True) (S1 (MetaSel (Just "_srURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_srDeployedURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

sourceRepository :: SourceRepository Source #

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

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

srURL :: Lens' SourceRepository (Maybe Text) Source #

The URL pointing to the hosted repository where the function is defined. There are supported Cloud Source Repository URLs in the following formats: To refer to a specific commit: `https://source.developers.google.com/projects/*/repos/*/revisions/*/paths/*` To refer to a moveable alias (branch): `https://source.developers.google.com/projects/*/repos/*/moveable-aliases/*/paths/*` In particular, to refer to HEAD use `master` moveable alias. To refer to a specific fixed alias (tag): `https://source.developers.google.com/projects/*/repos/*/fixed-aliases/*/paths/*` You may omit `paths/*` if you want to use the main directory.

srDeployedURL :: Lens' SourceRepository (Maybe Text) Source #

Output only. The URL pointing to the hosted repository where the function were defined at the time of deployment. It always points to a specific commit in the format described above.

OperationMetadataV1

data OperationMetadataV1 Source #

Metadata describing an Operation

See: operationMetadataV1 smart constructor.

Instances
Eq OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: OperationMetadataV1 -> Constr #

dataTypeOf :: OperationMetadataV1 -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep OperationMetadataV1 :: Type -> Type #

ToJSON OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1 Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1 = D1 (MetaData "OperationMetadataV1" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "OperationMetadataV1'" PrefixI True) ((S1 (MetaSel (Just "_omvVersionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_omvUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) :*: (S1 (MetaSel (Just "_omvType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationMetadataV1Type)) :*: (S1 (MetaSel (Just "_omvTarget") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_omvRequest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationMetadataV1Request))))))

operationMetadataV1 :: OperationMetadataV1 Source #

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

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

omvVersionId :: Lens' OperationMetadataV1 (Maybe Int64) Source #

Version id of the function created or updated by an API call. This field is only populated for Create and Update operations.

omvUpdateTime :: Lens' OperationMetadataV1 (Maybe UTCTime) Source #

The last update timestamp of the operation.

omvTarget :: Lens' OperationMetadataV1 (Maybe Text) Source #

Target of the operation - for example projects/project-1/locations/region-1/functions/function-1

omvRequest :: Lens' OperationMetadataV1 (Maybe OperationMetadataV1Request) Source #

The original request that started the operation.

CloudFunctionStatus

data CloudFunctionStatus Source #

Output only. Status of the function deployment.

Constructors

CloudFunctionStatusUnspecified

CLOUD_FUNCTION_STATUS_UNSPECIFIED Not specified. Invalid state.

Active

ACTIVE Function has been succesfully deployed and is serving.

Offline

OFFLINE Function deployment failed and the function isn’t serving.

DeployInProgress

DEPLOY_IN_PROGRESS Function is being created or updated.

DeleteInProgress

DELETE_IN_PROGRESS Function is being deleted.

Unknown

UNKNOWN Function deployment failed and the function serving state is undefined. The function should be updated or deleted to move it out of this state.

Instances
Enum CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Eq CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Data CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Methods

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

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

toConstr :: CloudFunctionStatus -> Constr #

dataTypeOf :: CloudFunctionStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Read CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Show CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Generic CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Associated Types

type Rep CloudFunctionStatus :: Type -> Type #

Hashable CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToJSON CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromJSON CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromHttpApiData CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToHttpApiData CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep CloudFunctionStatus Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep CloudFunctionStatus = D1 (MetaData "CloudFunctionStatus" "Network.Google.CloudFunctions.Types.Sum" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) ((C1 (MetaCons "CloudFunctionStatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Active" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Offline" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "DeployInProgress" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DeleteInProgress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Unknown" PrefixI False) (U1 :: Type -> Type))))

OperationMetadataV1Beta2Type

data OperationMetadataV1Beta2Type Source #

Type of operation.

Constructors

OMVBTOperationUnspecified

OPERATION_UNSPECIFIED Unknown operation type.

OMVBTCreateFunction

CREATE_FUNCTION Triggered by CreateFunction call

OMVBTUpdateFunction

UPDATE_FUNCTION Triggered by UpdateFunction call

OMVBTDeleteFunction

DELETE_FUNCTION Triggered by DeleteFunction call.

Instances
Enum OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Eq OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Data OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Methods

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

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

toConstr :: OperationMetadataV1Beta2Type -> Constr #

dataTypeOf :: OperationMetadataV1Beta2Type -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Read OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Show OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Generic OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Associated Types

type Rep OperationMetadataV1Beta2Type :: Type -> Type #

Hashable OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToJSON OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromJSON OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromHttpApiData OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToHttpApiData OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep OperationMetadataV1Beta2Type Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep OperationMetadataV1Beta2Type = D1 (MetaData "OperationMetadataV1Beta2Type" "Network.Google.CloudFunctions.Types.Sum" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) ((C1 (MetaCons "OMVBTOperationUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OMVBTCreateFunction" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "OMVBTUpdateFunction" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OMVBTDeleteFunction" PrefixI False) (U1 :: Type -> Type)))

GenerateDownloadURLResponse

data GenerateDownloadURLResponse Source #

Response of `GenerateDownloadUrl` method.

See: generateDownloadURLResponse smart constructor.

Instances
Eq GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: GenerateDownloadURLResponse -> Constr #

dataTypeOf :: GenerateDownloadURLResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep GenerateDownloadURLResponse :: Type -> Type #

ToJSON GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateDownloadURLResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep GenerateDownloadURLResponse = D1 (MetaData "GenerateDownloadURLResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "GenerateDownloadURLResponse'" PrefixI True) (S1 (MetaSel (Just "_gdurDownloadURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

generateDownloadURLResponse :: GenerateDownloadURLResponse Source #

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

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

gdurDownloadURL :: Lens' GenerateDownloadURLResponse (Maybe Text) Source #

The generated Google Cloud Storage signed URL that should be used for function source code download.

AuditLogConfigLogType

data AuditLogConfigLogType Source #

The log type that this config enables.

Constructors

LogTypeUnspecified

LOG_TYPE_UNSPECIFIED Default case. Should never be this.

AdminRead

ADMIN_READ Admin reads. Example: CloudIAM getIamPolicy

DataWrite

DATA_WRITE Data writes. Example: CloudSQL Users create

DataRead

DATA_READ Data reads. Example: CloudSQL Users list

Instances
Enum AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Eq AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Data AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Methods

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

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

toConstr :: AuditLogConfigLogType -> Constr #

dataTypeOf :: AuditLogConfigLogType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Read AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Show AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Generic AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Associated Types

type Rep AuditLogConfigLogType :: Type -> Type #

Hashable AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToJSON AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromJSON AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromHttpApiData AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToHttpApiData AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep AuditLogConfigLogType Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep AuditLogConfigLogType = D1 (MetaData "AuditLogConfigLogType" "Network.Google.CloudFunctions.Types.Sum" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) ((C1 (MetaCons "LogTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AdminRead" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DataWrite" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DataRead" PrefixI False) (U1 :: Type -> Type)))

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.CloudFunctions.Types.Sum" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

TestIAMPermissionsRequest

data TestIAMPermissionsRequest Source #

Request message for `TestIamPermissions` method.

See: testIAMPermissionsRequest smart constructor.

Instances
Eq TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: TestIAMPermissionsRequest -> Constr #

dataTypeOf :: TestIAMPermissionsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep TestIAMPermissionsRequest :: Type -> Type #

ToJSON TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep TestIAMPermissionsRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep TestIAMPermissionsRequest = D1 (MetaData "TestIAMPermissionsRequest" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "TestIAMPermissionsRequest'" PrefixI True) (S1 (MetaSel (Just "_tiprPermissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

testIAMPermissionsRequest :: TestIAMPermissionsRequest Source #

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

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

tiprPermissions :: Lens' TestIAMPermissionsRequest [Text] Source #

The set of permissions to check for the `resource`. Permissions with wildcards (such as '*' or 'storage.*') are not allowed. For more information see IAM Overview.

TestIAMPermissionsResponse

data TestIAMPermissionsResponse Source #

Response message for `TestIamPermissions` method.

See: testIAMPermissionsResponse smart constructor.

Instances
Eq TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: TestIAMPermissionsResponse -> Constr #

dataTypeOf :: TestIAMPermissionsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep TestIAMPermissionsResponse :: Type -> Type #

ToJSON TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep TestIAMPermissionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep TestIAMPermissionsResponse = D1 (MetaData "TestIAMPermissionsResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "TestIAMPermissionsResponse'" PrefixI True) (S1 (MetaSel (Just "_tiamprPermissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

testIAMPermissionsResponse :: TestIAMPermissionsResponse Source #

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

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

tiamprPermissions :: Lens' TestIAMPermissionsResponse [Text] Source #

A subset of `TestPermissionsRequest.permissions` that the caller is allowed.

Policy

data Policy Source #

Defines an Identity and Access Management (IAM) policy. It is used to specify access control policies for Cloud Platform resources. A `Policy` consists of a list of `bindings`. A `binding` binds a list of `members` to a `role`, where the members can be user accounts, Google groups, Google domains, and service accounts. A `role` is a named list of permissions defined by IAM. **JSON Example** { "bindings": [ { "role": "roles/owner", "members": [ "user:mike'example.com", "group:admins'example.com", "domain:google.com", "serviceAccount:my-other-app'appspot.gserviceaccount.com" ] }, { "role": "roles/viewer", "members": ["user:sean'example.com"] } ] } **YAML Example** bindings: - members: - user:mike'example.com - group:admins'example.com - domain:google.com - serviceAccount:my-other-app'appspot.gserviceaccount.com role: roles/owner - members: - user:sean'example.com role: roles/viewer For a description of IAM and its features, see the IAM developer's guide.

See: policy smart constructor.

Instances
Eq Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

Data Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: Policy -> Constr #

dataTypeOf :: Policy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep Policy :: Type -> Type #

Methods

from :: Policy -> Rep Policy x #

to :: Rep Policy x -> Policy #

ToJSON Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Policy Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Policy = D1 (MetaData "Policy" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "Policy'" PrefixI True) ((S1 (MetaSel (Just "_pAuditConfigs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AuditConfig])) :*: S1 (MetaSel (Just "_pEtag") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) :*: (S1 (MetaSel (Just "_pVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_pBindings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Binding])))))

policy :: Policy Source #

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

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

pAuditConfigs :: Lens' Policy [AuditConfig] Source #

Specifies cloud audit logging configuration for this policy.

pEtag :: Lens' Policy (Maybe ByteString) Source #

`etag` is used for optimistic concurrency control as a way to help prevent simultaneous updates of a policy from overwriting each other. It is strongly suggested that systems make use of the `etag` in the read-modify-write cycle to perform policy updates in order to avoid race conditions: An `etag` is returned in the response to `getIamPolicy`, and systems are expected to put that etag in the request to `setIamPolicy` to ensure that their change will be applied to the same version of the policy. If no `etag` is provided in the call to `setIamPolicy`, then the existing policy is overwritten blindly.

pBindings :: Lens' Policy [Binding] Source #

Associates a list of `members` to a `role`. `bindings` with no members will result in an error.

LocationLabels

data LocationLabels Source #

Cross-service attributes for the location. For example {"cloud.googleapis.com/region": "us-east1"}

See: locationLabels smart constructor.

Instances
Eq LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: LocationLabels -> Constr #

dataTypeOf :: LocationLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep LocationLabels :: Type -> Type #

ToJSON LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep LocationLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep LocationLabels = D1 (MetaData "LocationLabels" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "LocationLabels'" PrefixI True) (S1 (MetaSel (Just "_llAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

locationLabels Source #

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

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

ListFunctionsResponse

data ListFunctionsResponse Source #

Response for the `ListFunctions` method.

See: listFunctionsResponse smart constructor.

Instances
Eq ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: ListFunctionsResponse -> Constr #

dataTypeOf :: ListFunctionsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep ListFunctionsResponse :: Type -> Type #

ToJSON ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep ListFunctionsResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep ListFunctionsResponse = D1 (MetaData "ListFunctionsResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "ListFunctionsResponse'" PrefixI True) (S1 (MetaSel (Just "_lfrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lfrFunctions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CloudFunction]))))

listFunctionsResponse :: ListFunctionsResponse Source #

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

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

lfrNextPageToken :: Lens' ListFunctionsResponse (Maybe Text) Source #

If not empty, indicates that there may be more functions that match the request; this value should be passed in a new google.cloud.functions.v1.ListFunctionsRequest to get more functions.

lfrFunctions :: Lens' ListFunctionsResponse [CloudFunction] Source #

The functions that match the request.

LocationMetadata

data LocationMetadata Source #

Service-specific metadata. For example the available capacity at the given location.

See: locationMetadata smart constructor.

Instances
Eq LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: LocationMetadata -> Constr #

dataTypeOf :: LocationMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep LocationMetadata :: Type -> Type #

ToJSON LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep LocationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep LocationMetadata = D1 (MetaData "LocationMetadata" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "LocationMetadata'" PrefixI True) (S1 (MetaSel (Just "_lmAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

locationMetadata Source #

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

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

lmAddtional :: Lens' LocationMetadata (HashMap Text JSONValue) Source #

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

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.CloudFunctions.Types.Product

Data OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

Generic OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep OperationMetadata :: Type -> Type #

ToJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadata Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadata = D1 (MetaData "OperationMetadata" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" 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.

AuditLogConfig

data AuditLogConfig Source #

Provides the configuration for logging a type of permissions. Example: { "audit_log_configs": [ { "log_type": "DATA_READ", "exempted_members": [ "user:foo'gmail.com" ] }, { "log_type": "DATA_WRITE", } ] } This enables 'DATA_READ' and 'DATA_WRITE' logging, while exempting foo'gmail.com from DATA_READ logging.

See: auditLogConfig smart constructor.

Instances
Eq AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: AuditLogConfig -> Constr #

dataTypeOf :: AuditLogConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep AuditLogConfig :: Type -> Type #

ToJSON AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep AuditLogConfig Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep AuditLogConfig = D1 (MetaData "AuditLogConfig" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "AuditLogConfig'" PrefixI True) (S1 (MetaSel (Just "_alcLogType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AuditLogConfigLogType)) :*: S1 (MetaSel (Just "_alcExemptedMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))

auditLogConfig :: AuditLogConfig Source #

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

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

alcLogType :: Lens' AuditLogConfig (Maybe AuditLogConfigLogType) Source #

The log type that this config enables.

alcExemptedMembers :: Lens' AuditLogConfig [Text] Source #

Specifies the identities that do not cause logging for this type of permission. Follows the same format of Binding.members.

CloudFunction

data CloudFunction Source #

Describes a Cloud Function that contains user computation executed in response to an event. It encapsulate function and triggers configurations. LINT.IfChange

See: cloudFunction smart constructor.

Instances
Eq CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: CloudFunction -> Constr #

dataTypeOf :: CloudFunction -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep CloudFunction :: Type -> Type #

ToJSON CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CloudFunction Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CloudFunction = D1 (MetaData "CloudFunction" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "CloudFunction'" PrefixI True) ((((S1 (MetaSel (Just "_cfRuntime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cfStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CloudFunctionStatus))) :*: (S1 (MetaSel (Just "_cfSourceArchiveURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cfVersionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_cfSourceUploadURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_cfEntryPoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cfHTTPSTrigger") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HTTPSTrigger))) :*: (S1 (MetaSel (Just "_cfNetwork") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cfMaxInstances") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_cfEventTrigger") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EventTrigger)))))) :*: (((S1 (MetaSel (Just "_cfUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_cfName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_cfSourceRepository") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SourceRepository)) :*: (S1 (MetaSel (Just "_cfAvailableMemoryMb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_cfLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CloudFunctionLabels))))) :*: ((S1 (MetaSel (Just "_cfServiceAccountEmail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cfEnvironmentVariables") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CloudFunctionEnvironmentVariables))) :*: (S1 (MetaSel (Just "_cfTimeout") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration)) :*: (S1 (MetaSel (Just "_cfVPCConnector") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cfDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

cfRuntime :: Lens' CloudFunction (Maybe Text) Source #

The runtime in which the function is going to run. If empty, defaults to Node.js 6.

cfStatus :: Lens' CloudFunction (Maybe CloudFunctionStatus) Source #

Output only. Status of the function deployment.

cfSourceArchiveURL :: Lens' CloudFunction (Maybe Text) Source #

The Google Cloud Storage URL, starting with gs://, pointing to the zip archive which contains the function.

cfVersionId :: Lens' CloudFunction (Maybe Int64) Source #

Output only. The version identifier of the Cloud Function. Each deployment attempt results in a new version of a function being created.

cfSourceUploadURL :: Lens' CloudFunction (Maybe Text) Source #

The Google Cloud Storage signed URL used for source uploading, generated by google.cloud.functions.v1.GenerateUploadUrl

cfEntryPoint :: Lens' CloudFunction (Maybe Text) Source #

The name of the function (as defined in source code) that will be executed. Defaults to the resource name suffix, if not specified. For backward compatibility, if function with given name is not found, then the system will try to use function named "function". For Node.js this is name of a function exported by the module specified in `source_location`.

cfHTTPSTrigger :: Lens' CloudFunction (Maybe HTTPSTrigger) Source #

An HTTPS endpoint type of source that can be triggered via URL.

cfNetwork :: Lens' CloudFunction (Maybe Text) Source #

The VPC Network that this cloud function can connect to. It can be either the fully-qualified URI, or the short name of the network resource. If the short network name is used, the network must belong to the same project. Otherwise, it must belong to a project within the same organization. The format of this field is either `projects/{project}/global/networks/{network}` or `{network}`, where {project} is a project id where the network is defined, and {network} is the short name of the network. This field is mutually exclusive with `vpc_connector` and will be replaced by it. See the VPC documentation for more information on connecting Cloud projects. This feature is currently in alpha, available only for whitelisted users.

cfMaxInstances :: Lens' CloudFunction (Maybe Int32) Source #

The limit on the maximum number of function instances that may coexist at a given time. This feature is currently in alpha, available only for whitelisted users.

cfEventTrigger :: Lens' CloudFunction (Maybe EventTrigger) Source #

A source that fires events in response to a condition in another service.

cfUpdateTime :: Lens' CloudFunction (Maybe UTCTime) Source #

Output only. The last update timestamp of a Cloud Function.

cfName :: Lens' CloudFunction (Maybe Text) Source #

A user-defined name of the function. Function names must be unique globally and match pattern `projects/*/locations/*/functions/*`

cfSourceRepository :: Lens' CloudFunction (Maybe SourceRepository) Source #

  • *Beta Feature** The source repository where a function is hosted.

cfAvailableMemoryMb :: Lens' CloudFunction (Maybe Int32) Source #

The amount of memory in MB available for a function. Defaults to 256MB.

cfLabels :: Lens' CloudFunction (Maybe CloudFunctionLabels) Source #

Labels associated with this Cloud Function.

cfServiceAccountEmail :: Lens' CloudFunction (Maybe Text) Source #

Output only. The email of the function's service account.

cfEnvironmentVariables :: Lens' CloudFunction (Maybe CloudFunctionEnvironmentVariables) Source #

Environment variables that shall be available during function execution.

cfTimeout :: Lens' CloudFunction (Maybe Scientific) Source #

The function execution timeout. Execution is considered failed and can be terminated if the function is not completed at the end of the timeout period. Defaults to 60 seconds.

cfVPCConnector :: Lens' CloudFunction (Maybe Text) Source #

The VPC Network Connector that this cloud function can connect to. It can be either the fully-qualified URI, or the short name of the network connector resource. The format of this field is `projects/*/locations/*/connectors/*` This field is mutually exclusive with `network` field and will eventually replace it. See the VPC documentation for more information on connecting Cloud projects. This feature is currently in alpha, available only for whitelisted users.

cfDescription :: Lens' CloudFunction (Maybe Text) Source #

User-provided description of a function.

OperationMetadataV1Beta2Request

data OperationMetadataV1Beta2Request Source #

The original request that started the operation.

See: operationMetadataV1Beta2Request smart constructor.

Instances
Eq OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: OperationMetadataV1Beta2Request -> Constr #

dataTypeOf :: OperationMetadataV1Beta2Request -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep OperationMetadataV1Beta2Request :: Type -> Type #

ToJSON OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1Beta2Request Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationMetadataV1Beta2Request = D1 (MetaData "OperationMetadataV1Beta2Request" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "OperationMetadataV1Beta2Request'" PrefixI True) (S1 (MetaSel (Just "_omvbrAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

operationMetadataV1Beta2Request Source #

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

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

omvbrAddtional :: Lens' OperationMetadataV1Beta2Request (HashMap Text JSONValue) Source #

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

CloudFunctionLabels

data CloudFunctionLabels Source #

Labels associated with this Cloud Function.

See: cloudFunctionLabels smart constructor.

Instances
Eq CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: CloudFunctionLabels -> Constr #

dataTypeOf :: CloudFunctionLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep CloudFunctionLabels :: Type -> Type #

ToJSON CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CloudFunctionLabels Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CloudFunctionLabels = D1 (MetaData "CloudFunctionLabels" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "CloudFunctionLabels'" PrefixI True) (S1 (MetaSel (Just "_cflAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

cloudFunctionLabels Source #

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

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

OperationResponse

data OperationResponse Source #

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

See: operationResponse smart constructor.

Instances
Eq OperationResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data OperationResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.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.CloudFunctions.Types.Product

Generic OperationResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep OperationResponse :: Type -> Type #

ToJSON OperationResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON OperationResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationResponse Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep OperationResponse = D1 (MetaData "OperationResponse" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" 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.

CallFunctionRequest

data CallFunctionRequest Source #

Request for the `CallFunction` method.

See: callFunctionRequest smart constructor.

Instances
Eq CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Data CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: CallFunctionRequest -> Constr #

dataTypeOf :: CallFunctionRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep CallFunctionRequest :: Type -> Type #

ToJSON CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CallFunctionRequest Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep CallFunctionRequest = D1 (MetaData "CallFunctionRequest" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" True) (C1 (MetaCons "CallFunctionRequest'" PrefixI True) (S1 (MetaSel (Just "_cfrData") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

callFunctionRequest :: CallFunctionRequest Source #

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

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

cfrData :: Lens' CallFunctionRequest (Maybe Text) Source #

Input to be passed to the function.

Binding

data Binding Source #

Associates `members` with a `role`.

See: binding smart constructor.

Instances
Eq Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

Data Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Methods

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

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

toConstr :: Binding -> Constr #

dataTypeOf :: Binding -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Generic Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

Associated Types

type Rep Binding :: Type -> Type #

Methods

from :: Binding -> Rep Binding x #

to :: Rep Binding x -> Binding #

ToJSON Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

FromJSON Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Binding Source # 
Instance details

Defined in Network.Google.CloudFunctions.Types.Product

type Rep Binding = D1 (MetaData "Binding" "Network.Google.CloudFunctions.Types.Product" "gogol-cloudfunctions-0.4.0-6sCZoOCvrpODwDOeEfObaJ" False) (C1 (MetaCons "Binding'" PrefixI True) (S1 (MetaSel (Just "_bMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_bRole") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Expr)))))

binding :: Binding Source #

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

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

bMembers :: Lens' Binding [Text] Source #

Specifies the identities requesting access for a Cloud Platform resource. `members` can have the following values: * `allUsers`: A special identifier that represents anyone who is on the internet; with or without a Google account. * `allAuthenticatedUsers`: A special identifier that represents anyone who is authenticated with a Google account or a service account. * `user:{emailid}`: An email address that represents a specific Google account. For example, `alice'gmail.com` . * `serviceAccount:{emailid}`: An email address that represents a service account. For example, `my-other-app'appspot.gserviceaccount.com`. * `group:{emailid}`: An email address that represents a Google group. For example, `admins'example.com`. * `domain:{domain}`: A Google Apps domain name that represents all the users of that domain. For example, `google.com` or `example.com`.

bRole :: Lens' Binding (Maybe Text) Source #

Role that is assigned to `members`. For example, `roles/viewer`, `roles/editor`, or `roles/owner`.

bCondition :: Lens' Binding (Maybe Expr) Source #

Unimplemented. The condition that is associated with this binding. NOTE: an unsatisfied condition will not allow user access via current binding. Different bindings, including their conditions, are examined independently.