gogol-deploymentmanager-0.4.0: Google Cloud Deployment Manager 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.DeploymentManager.Types

Contents

Description

 
Synopsis

Service Configuration

deploymentManagerService :: ServiceConfig Source #

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

OAuth Scopes

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

View your data across Google Cloud Platform services

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

View and manage your data across Google Cloud Platform services

ndevCloudmanScope :: Proxy '["https://www.googleapis.com/auth/ndev.cloudman"] Source #

View and manage your Google Cloud Platform management resources and deployment status information

ndevCloudmanReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/ndev.cloudman.readonly"] Source #

View your Google Cloud Platform management resources and deployment status information

OperationWarningsItemDataItem

data OperationWarningsItemDataItem Source #

Instances
Eq OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: OperationWarningsItemDataItem -> Constr #

dataTypeOf :: OperationWarningsItemDataItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep OperationWarningsItemDataItem :: Type -> Type #

ToJSON OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationWarningsItemDataItem = D1 (MetaData "OperationWarningsItemDataItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "OperationWarningsItemDataItem'" PrefixI True) (S1 (MetaSel (Just "_owidiValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_owidiKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

operationWarningsItemDataItem :: OperationWarningsItemDataItem Source #

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

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

owidiValue :: Lens' OperationWarningsItemDataItem (Maybe Text) Source #

Output Only
A warning data value corresponding to the key.

owidiKey :: Lens' OperationWarningsItemDataItem (Maybe Text) Source #

Output Only
A key that provides more detail on the warning being returned. For example, for warnings where there are no results in a list request for a particular zone, this key might be scope and the key value might be the zone name. Other examples might be a key indicating a deprecated resource and a suggested replacement, or a warning about invalid network settings (for example, if an instance attempts to perform IP forwarding but is not enabled for IP forwarding).

ConfigFile

data ConfigFile Source #

See: configFile smart constructor.

Instances
Eq ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ConfigFile -> Constr #

dataTypeOf :: ConfigFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ConfigFile :: Type -> Type #

ToJSON ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ConfigFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ConfigFile = D1 (MetaData "ConfigFile" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "ConfigFile'" PrefixI True) (S1 (MetaSel (Just "_cfContent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

configFile :: ConfigFile Source #

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

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

cfContent :: Lens' ConfigFile (Maybe Text) Source #

The contents of the file.

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

Data AuditConfig Source # 
Instance details

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

Generic AuditConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep AuditConfig :: Type -> Type #

ToJSON AuditConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON AuditConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep AuditConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep AuditConfig = D1 (MetaData "AuditConfig" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" 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])) :*: S1 (MetaSel (Just "_acExemptedMembers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))

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.

DeploymentsUpdateCreatePolicy

data DeploymentsUpdateCreatePolicy Source #

Sets the policy to use for creating new resources.

Constructors

Acquire
ACQUIRE
CreateOrAcquire
CREATE_OR_ACQUIRE
Instances
Enum DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Eq DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Data DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Methods

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

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

toConstr :: DeploymentsUpdateCreatePolicy -> Constr #

dataTypeOf :: DeploymentsUpdateCreatePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Read DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Show DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Generic DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Associated Types

type Rep DeploymentsUpdateCreatePolicy :: Type -> Type #

Hashable DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToJSON DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromJSON DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromHttpApiData DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToHttpApiData DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsUpdateCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsUpdateCreatePolicy = D1 (MetaData "DeploymentsUpdateCreatePolicy" "Network.Google.DeploymentManager.Types.Sum" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Acquire" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CreateOrAcquire" PrefixI False) (U1 :: Type -> Type))

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

Methods

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

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

Data Expr Source # 
Instance details

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

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Generic Expr Source # 
Instance details

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

FromJSON Expr Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Expr Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Expr = D1 (MetaData "Expr" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" 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.

OperationsListResponse

data OperationsListResponse Source #

A response containing a partial list of operations and a page token used to build the next request if the request has been truncated.

See: operationsListResponse smart constructor.

Instances
Eq OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: OperationsListResponse -> Constr #

dataTypeOf :: OperationsListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep OperationsListResponse :: Type -> Type #

ToJSON OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationsListResponse = D1 (MetaData "OperationsListResponse" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "OperationsListResponse'" PrefixI True) (S1 (MetaSel (Just "_olrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olrOperations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Operation]))))

operationsListResponse :: OperationsListResponse Source #

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

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

olrNextPageToken :: Lens' OperationsListResponse (Maybe Text) Source #

Output only. A token used to continue a truncated list request.

olrOperations :: Lens' OperationsListResponse [Operation] Source #

Output only. Operations contained in this list response.

ResourceUpdateWarningsItemDataItem

data ResourceUpdateWarningsItemDataItem Source #

Instances
Eq ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceUpdateWarningsItemDataItem -> Constr #

dataTypeOf :: ResourceUpdateWarningsItemDataItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceUpdateWarningsItemDataItem :: Type -> Type #

ToJSON ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateWarningsItemDataItem = D1 (MetaData "ResourceUpdateWarningsItemDataItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ResourceUpdateWarningsItemDataItem'" PrefixI True) (S1 (MetaSel (Just "_ruwidiValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ruwidiKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

resourceUpdateWarningsItemDataItem :: ResourceUpdateWarningsItemDataItem Source #

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

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

ruwidiValue :: Lens' ResourceUpdateWarningsItemDataItem (Maybe Text) Source #

Output Only
A warning data value corresponding to the key.

ruwidiKey :: Lens' ResourceUpdateWarningsItemDataItem (Maybe Text) Source #

Output Only
A key that provides more detail on the warning being returned. For example, for warnings where there are no results in a list request for a particular zone, this key might be scope and the key value might be the zone name. Other examples might be a key indicating a deprecated resource and a suggested replacement, or a warning about invalid network settings (for example, if an instance attempts to perform IP forwarding but is not enabled for IP forwarding).

DeploymentsDeleteDeletePolicy

data DeploymentsDeleteDeletePolicy Source #

Sets the policy to use for deleting resources.

Constructors

Abandon
ABANDON
Delete'
DELETE
Instances
Enum DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Eq DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Data DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Methods

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

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

toConstr :: DeploymentsDeleteDeletePolicy -> Constr #

dataTypeOf :: DeploymentsDeleteDeletePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Read DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Show DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Generic DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Associated Types

type Rep DeploymentsDeleteDeletePolicy :: Type -> Type #

Hashable DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToJSON DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromJSON DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromHttpApiData DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToHttpApiData DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsDeleteDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsDeleteDeletePolicy = D1 (MetaData "DeploymentsDeleteDeletePolicy" "Network.Google.DeploymentManager.Types.Sum" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Abandon" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Delete'" PrefixI False) (U1 :: Type -> Type))

TypesListResponse

data TypesListResponse Source #

A response that returns all Types supported by Deployment Manager

See: typesListResponse smart constructor.

Instances
Eq TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: TypesListResponse -> Constr #

dataTypeOf :: TypesListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep TypesListResponse :: Type -> Type #

ToJSON TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TypesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TypesListResponse = D1 (MetaData "TypesListResponse" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "TypesListResponse'" PrefixI True) (S1 (MetaSel (Just "_tlrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tlrTypes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Type]))))

typesListResponse :: TypesListResponse Source #

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

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

tlrNextPageToken :: Lens' TypesListResponse (Maybe Text) Source #

A token used to continue a truncated list request.

tlrTypes :: Lens' TypesListResponse [Type] Source #

Output only. A list of resource types supported by Deployment Manager.

LogConfigCounterOptions

data LogConfigCounterOptions Source #

Increment a streamz counter with the specified metric and field names. Metric names should start with a '/', generally be lowercase-only, and end in "_count". Field names should not contain an initial slash. The actual exported metric names will have "/iam/policy" prepended. Field names correspond to IAM request parameters and field values are their respective values. Supported field names: - "authority", which is "[token]" if IAMContext.token is present, otherwise the value of IAMContext.authority_selector if present, and otherwise a representation of IAMContext.principal; or - "iam_principal", a representation of IAMContext.principal even if a token or authority selector is present; or - "" (empty string), resulting in a counter with no fields. Examples: counter { metric: "/debug_access_count" field: "iam_principal" } ==> increment counter /iam/policy/backend_debug_access_count {iam_principal=[value of IAMContext.principal]} At this time we do not support multiple field names (though this may be supported in the future).

See: logConfigCounterOptions smart constructor.

Instances
Eq LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: LogConfigCounterOptions -> Constr #

dataTypeOf :: LogConfigCounterOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep LogConfigCounterOptions :: Type -> Type #

ToJSON LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfigCounterOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfigCounterOptions = D1 (MetaData "LogConfigCounterOptions" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "LogConfigCounterOptions'" PrefixI True) (S1 (MetaSel (Just "_lccoField") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lccoMetric") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

logConfigCounterOptions :: LogConfigCounterOptions Source #

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

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

lccoField :: Lens' LogConfigCounterOptions (Maybe Text) Source #

The field value to attribute.

DeploymentsUpdateDeletePolicy

data DeploymentsUpdateDeletePolicy Source #

Sets the policy to use for deleting resources.

Constructors

DUDPAbandon
ABANDON
DUDPDelete'
DELETE
Instances
Enum DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Eq DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Data DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Methods

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

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

toConstr :: DeploymentsUpdateDeletePolicy -> Constr #

dataTypeOf :: DeploymentsUpdateDeletePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Read DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Show DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Generic DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Associated Types

type Rep DeploymentsUpdateDeletePolicy :: Type -> Type #

Hashable DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToJSON DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromJSON DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromHttpApiData DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToHttpApiData DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsUpdateDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsUpdateDeletePolicy = D1 (MetaData "DeploymentsUpdateDeletePolicy" "Network.Google.DeploymentManager.Types.Sum" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DUDPAbandon" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DUDPDelete'" PrefixI False) (U1 :: Type -> Type))

DeploymentsPatchDeletePolicy

data DeploymentsPatchDeletePolicy Source #

Sets the policy to use for deleting resources.

Constructors

DPDPAbandon
ABANDON
DPDPDelete'
DELETE
Instances
Enum DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Eq DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Data DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Methods

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

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

toConstr :: DeploymentsPatchDeletePolicy -> Constr #

dataTypeOf :: DeploymentsPatchDeletePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Read DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Show DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Generic DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Associated Types

type Rep DeploymentsPatchDeletePolicy :: Type -> Type #

Hashable DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToJSON DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromJSON DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromHttpApiData DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToHttpApiData DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsPatchDeletePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsPatchDeletePolicy = D1 (MetaData "DeploymentsPatchDeletePolicy" "Network.Google.DeploymentManager.Types.Sum" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DPDPAbandon" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DPDPDelete'" PrefixI False) (U1 :: Type -> Type))

Operation

data Operation Source #

An Operation resource, used to manage asynchronous API requests. (== resource_for v1.globalOperations ==) (== resource_for beta.globalOperations ==) (== resource_for v1.regionOperations ==) (== resource_for beta.regionOperations ==) (== resource_for v1.zoneOperations ==) (== resource_for beta.zoneOperations ==)

See: operation smart constructor.

Instances
Eq Operation Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data Operation Source # 
Instance details

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

Generic Operation Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Operation :: Type -> Type #

ToJSON Operation Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Operation Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Operation Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Operation = D1 (MetaData "Operation" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Operation'" PrefixI True) ((((S1 (MetaSel (Just "_oTargetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_oStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_oInsertTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oProgress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_oStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_oKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_oError") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OperationError)) :*: S1 (MetaSel (Just "_oHTTPErrorMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_oZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oWarnings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OperationWarningsItem])) :*: S1 (MetaSel (Just "_oHTTPErrorStatusCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))) :*: (((S1 (MetaSel (Just "_oUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oSelfLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_oStatusMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oCreationTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_oId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: (S1 (MetaSel (Just "_oOperationType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_oDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oTargetLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oClientOperationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

oTargetId :: Lens' Operation (Maybe Word64) Source #

Output Only
The unique target ID, which identifies a specific incarnation of the target resource.

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

Output Only
The status of the operation, which can be one of the following: PENDING, RUNNING, or DONE.

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

Output Only
The time that this operation was requested. This value is in RFC3339 text format.

oProgress :: Lens' Operation (Maybe Int32) Source #

Output Only
An optional progress indicator that ranges from 0 to 100. There is no requirement that this be linear or support any granularity of operations. This should not be used to guess when the operation will be complete. This number should monotonically increase as the operation progresses.

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

Output Only
The time that this operation was started by the server. This value is in RFC3339 text format.

oKind :: Lens' Operation Text Source #

Output Only
Type of the resource. Always compute#operation for Operation resources.

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

Output Only
If errors are generated during processing of the operation, this field will be populated.

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

Output Only
If the operation fails, this field contains the HTTP error message that was returned, such as NOT FOUND.

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

Output Only
The URL of the zone where the operation resides. Only available when performing per-zone operations. You must specify this field as part of the HTTP request URL. It is not settable as a field in the request body.

oWarnings :: Lens' Operation [OperationWarningsItem] Source #

Output Only
If warning messages are generated during processing of the operation, this field will be populated.

oHTTPErrorStatusCode :: Lens' Operation (Maybe Int32) Source #

Output Only
If the operation fails, this field contains the HTTP error status code that was returned. For example, a 404 means the resource was not found.

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

Output Only
User who requested the operation, for example: user'example.com.

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

Output Only
Server-defined URL for the resource.

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

Output Only
Name of the resource.

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

Output Only
An optional textual description of the current status of the operation.

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

Deprecated
This field is deprecated.

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

Output Only
The time that this operation was completed. This value is in RFC3339 text format.

oId :: Lens' Operation (Maybe Word64) Source #

Output Only
The unique identifier for the resource. This identifier is defined by the server.

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

Output Only
The type of operation, such as insert, update, or delete, and so on.

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

Output Only
The URL of the region where the operation resides. Only available when performing regional operations. You must specify this field as part of the HTTP request URL. It is not settable as a field in the request body.

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

Output Only
A textual description of the operation, which is set when the operation is created.

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

Output Only
The URL of the resource that the operation modifies. For operations related to creating a snapshot, this points to the persistent disk that the snapshot was created from.

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

Output Only
The value of `requestId` if you provided it in the request. Not present otherwise.

TestPermissionsResponse

data TestPermissionsResponse Source #

Instances
Eq TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: TestPermissionsResponse -> Constr #

dataTypeOf :: TestPermissionsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep TestPermissionsResponse :: Type -> Type #

ToJSON TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TestPermissionsResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TestPermissionsResponse = D1 (MetaData "TestPermissionsResponse" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "TestPermissionsResponse'" PrefixI True) (S1 (MetaSel (Just "_tprPermissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

testPermissionsResponse :: TestPermissionsResponse Source #

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

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

tprPermissions :: Lens' TestPermissionsResponse [Text] Source #

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

DeploymentsPatchCreatePolicy

data DeploymentsPatchCreatePolicy Source #

Sets the policy to use for creating new resources.

Constructors

DPCPAcquire
ACQUIRE
DPCPCreateOrAcquire
CREATE_OR_ACQUIRE
Instances
Enum DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Eq DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Data DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Methods

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

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

toConstr :: DeploymentsPatchCreatePolicy -> Constr #

dataTypeOf :: DeploymentsPatchCreatePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Read DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Show DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Generic DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Associated Types

type Rep DeploymentsPatchCreatePolicy :: Type -> Type #

Hashable DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToJSON DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromJSON DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromHttpApiData DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToHttpApiData DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsPatchCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsPatchCreatePolicy = D1 (MetaData "DeploymentsPatchCreatePolicy" "Network.Google.DeploymentManager.Types.Sum" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DPCPAcquire" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DPCPCreateOrAcquire" PrefixI False) (U1 :: Type -> Type))

ResourcesListResponse

data ResourcesListResponse Source #

A response containing a partial list of resources and a page token used to build the next request if the request has been truncated.

See: resourcesListResponse smart constructor.

Instances
Eq ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourcesListResponse -> Constr #

dataTypeOf :: ResourcesListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourcesListResponse :: Type -> Type #

ToJSON ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourcesListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourcesListResponse = D1 (MetaData "ResourcesListResponse" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ResourcesListResponse'" PrefixI True) (S1 (MetaSel (Just "_rlrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rlrResources") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Resource]))))

resourcesListResponse :: ResourcesListResponse Source #

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

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

rlrNextPageToken :: Lens' ResourcesListResponse (Maybe Text) Source #

A token used to continue a truncated list request.

rlrResources :: Lens' ResourcesListResponse [Resource] Source #

Resources contained in this list response.

DeploymentUpdate

data DeploymentUpdate Source #

See: deploymentUpdate smart constructor.

Instances
Eq DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: DeploymentUpdate -> Constr #

dataTypeOf :: DeploymentUpdate -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep DeploymentUpdate :: Type -> Type #

ToJSON DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentUpdate = D1 (MetaData "DeploymentUpdate" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DeploymentUpdate'" PrefixI True) (S1 (MetaSel (Just "_duManifest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_duLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DeploymentUpdateLabelEntry])) :*: S1 (MetaSel (Just "_duDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

deploymentUpdate :: DeploymentUpdate Source #

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

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

duManifest :: Lens' DeploymentUpdate (Maybe Text) Source #

Output only. URL of the manifest representing the update configuration of this deployment.

duLabels :: Lens' DeploymentUpdate [DeploymentUpdateLabelEntry] Source #

Output only. Map of labels; provided by the client when the resource is created or updated. Specifically: Label keys must be between 1 and 63 characters long and must conform to the following regular expression: a-z? Label values must be between 0 and 63 characters long and must conform to the regular expression ([a-z]([-a-z0-9]*[a-z0-9])?)?

duDescription :: Lens' DeploymentUpdate (Maybe Text) Source #

Output only. An optional user-provided description of the deployment after the current update has been applied.

ResourceUpdate

data ResourceUpdate Source #

See: resourceUpdate smart constructor.

Instances
Eq ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceUpdate -> Constr #

dataTypeOf :: ResourceUpdate -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceUpdate :: Type -> Type #

ToJSON ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdate Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

resourceUpdate :: ResourceUpdate Source #

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

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

ruState :: Lens' ResourceUpdate (Maybe Text) Source #

Output only. The state of the resource.

ruError :: Lens' ResourceUpdate (Maybe ResourceUpdateError) Source #

Output only. If errors are generated during update of the resource, this field will be populated.

ruAccessControl :: Lens' ResourceUpdate (Maybe ResourceAccessControl) Source #

The Access Control Policy to set on this resource after updating the resource itself.

ruWarnings :: Lens' ResourceUpdate [ResourceUpdateWarningsItem] Source #

Output only. If warning messages are generated during processing of this resource, this field will be populated.

ruIntent :: Lens' ResourceUpdate (Maybe Text) Source #

Output only. The intent of the resource: PREVIEW, UPDATE, or CANCEL.

ruManifest :: Lens' ResourceUpdate (Maybe Text) Source #

Output only. URL of the manifest representing the update configuration of this resource.

ruFinalProperties :: Lens' ResourceUpdate (Maybe Text) Source #

Output only. The expanded properties of the resource with reference values expanded. Returned as serialized YAML.

ruProperties :: Lens' ResourceUpdate (Maybe Text) Source #

Output only. The set of updated properties for this resource, before references are expanded. Returned as serialized YAML.

DeploymentLabelEntry

data DeploymentLabelEntry Source #

Instances
Eq DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: DeploymentLabelEntry -> Constr #

dataTypeOf :: DeploymentLabelEntry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep DeploymentLabelEntry :: Type -> Type #

ToJSON DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentLabelEntry = D1 (MetaData "DeploymentLabelEntry" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DeploymentLabelEntry'" PrefixI True) (S1 (MetaSel (Just "_dleValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dleKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

deploymentLabelEntry :: DeploymentLabelEntry Source #

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

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

Rule

data Rule Source #

A rule to be applied in a Policy.

See: rule smart constructor.

Instances
Eq Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

Data Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: Rule -> Constr #

dataTypeOf :: Rule -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

showsPrec :: Int -> Rule -> ShowS #

show :: Rule -> String #

showList :: [Rule] -> ShowS #

Generic Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Rule :: Type -> Type #

Methods

from :: Rule -> Rep Rule x #

to :: Rep Rule x -> Rule #

ToJSON Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Rule Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Rule = D1 (MetaData "Rule" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Rule'" PrefixI True) ((S1 (MetaSel (Just "_rAction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rNotIns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_rIns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))) :*: ((S1 (MetaSel (Just "_rLogConfigs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [LogConfig])) :*: S1 (MetaSel (Just "_rConditions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Condition]))) :*: (S1 (MetaSel (Just "_rPermissions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_rDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

rule :: Rule Source #

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

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

rNotIns :: Lens' Rule [Text] Source #

If one or more 'not_in' clauses are specified, the rule matches if the PRINCIPAL/AUTHORITY_SELECTOR is in none of the entries.

rIns :: Lens' Rule [Text] Source #

If one or more 'in' clauses are specified, the rule matches if the PRINCIPAL/AUTHORITY_SELECTOR is in at least one of these entries.

rLogConfigs :: Lens' Rule [LogConfig] Source #

The config returned to callers of tech.iam.IAM.CheckPolicy for any entries that match the LOG action.

rConditions :: Lens' Rule [Condition] Source #

Additional restrictions that must be met. All conditions must pass for the rule to match.

rPermissions :: Lens' Rule [Text] Source #

A permission is a string of form '..' (e.g., 'storage.buckets.list'). A value of '*' matches all permissions, and a verb part of '*' (e.g., 'storage.buckets.*') matches all verbs.

rDescription :: Lens' Rule (Maybe Text) Source #

Human-readable description of the rule.

TestPermissionsRequest

data TestPermissionsRequest Source #

Instances
Eq TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: TestPermissionsRequest -> Constr #

dataTypeOf :: TestPermissionsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep TestPermissionsRequest :: Type -> Type #

ToJSON TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TestPermissionsRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TestPermissionsRequest = D1 (MetaData "TestPermissionsRequest" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "TestPermissionsRequest'" PrefixI True) (S1 (MetaSel (Just "_tPermissions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

testPermissionsRequest :: TestPermissionsRequest Source #

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

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

tPermissions :: Lens' TestPermissionsRequest [Text] Source #

The set of permissions to check for the 'resource'. Permissions with wildcards (such as '*' or 'storage.*') are not allowed.

Manifest

data Manifest Source #

See: manifest smart constructor.

Instances
Eq Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: Manifest -> Constr #

dataTypeOf :: Manifest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Manifest :: Type -> Type #

Methods

from :: Manifest -> Rep Manifest x #

to :: Rep Manifest x -> Manifest #

ToJSON Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Manifest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

manifest :: Manifest Source #

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

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

mInsertTime :: Lens' Manifest (Maybe Text) Source #

Output only. Creation timestamp in RFC3339 text format.

mLayout :: Lens' Manifest (Maybe Text) Source #

Output only. The YAML layout for this manifest.

mConfig :: Lens' Manifest (Maybe ConfigFile) Source #

Output only. The YAML configuration for this manifest.

mExpandedConfig :: Lens' Manifest (Maybe Text) Source #

Output only. The fully-expanded configuration file, including any templates and references.

mImports :: Lens' Manifest [ImportFile] Source #

Output only. The imported files for this manifest.

mSelfLink :: Lens' Manifest (Maybe Text) Source #

Output only. Self link for the manifest.

mName :: Lens' Manifest (Maybe Text) Source #

Output only. The name of the manifest.

ResourceUpdateWarningsItem

data ResourceUpdateWarningsItem Source #

Instances
Eq ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceUpdateWarningsItem -> Constr #

dataTypeOf :: ResourceUpdateWarningsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceUpdateWarningsItem :: Type -> Type #

ToJSON ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateWarningsItem = D1 (MetaData "ResourceUpdateWarningsItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ResourceUpdateWarningsItem'" PrefixI True) (S1 (MetaSel (Just "_ruwiData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ResourceUpdateWarningsItemDataItem])) :*: (S1 (MetaSel (Just "_ruwiCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ruwiMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

resourceUpdateWarningsItem :: ResourceUpdateWarningsItem Source #

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

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

ruwiData :: Lens' ResourceUpdateWarningsItem [ResourceUpdateWarningsItemDataItem] Source #

Output Only
Metadata about this warning in key: value format. For example: "data": [ { "key": "scope", "value": "zones/us-east1-d" }

ruwiCode :: Lens' ResourceUpdateWarningsItem (Maybe Text) Source #

Output Only
A warning code, if applicable. For example, Compute Engine returns NO_RESULTS_ON_PAGE if there are no results in the response.

ruwiMessage :: Lens' ResourceUpdateWarningsItem (Maybe Text) Source #

Output Only
A human-readable description of the warning code.

DeploymentsCancelPreviewRequest

data DeploymentsCancelPreviewRequest Source #

See: deploymentsCancelPreviewRequest smart constructor.

Instances
Eq DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: DeploymentsCancelPreviewRequest -> Constr #

dataTypeOf :: DeploymentsCancelPreviewRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep DeploymentsCancelPreviewRequest :: Type -> Type #

ToJSON DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentsCancelPreviewRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentsCancelPreviewRequest = D1 (MetaData "DeploymentsCancelPreviewRequest" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "DeploymentsCancelPreviewRequest'" PrefixI True) (S1 (MetaSel (Just "_dcprFingerprint") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bytes))))

deploymentsCancelPreviewRequest :: DeploymentsCancelPreviewRequest Source #

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

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

dcprFingerprint :: Lens' DeploymentsCancelPreviewRequest (Maybe ByteString) Source #

Specifies a fingerprint for cancelPreview() requests. A fingerprint is a randomly generated value that must be provided in cancelPreview() requests to perform optimistic locking. This ensures optimistic concurrency so that the deployment does not have conflicting requests (e.g. if someone attempts to make a new update request while another user attempts to cancel a preview, this would prevent one of the requests). The fingerprint is initially generated by Deployment Manager and changes after every request to modify a deployment. To get the latest fingerprint value, perform a get() request on the deployment.

LogConfigCloudAuditOptions

data LogConfigCloudAuditOptions Source #

Write a Cloud Audit log

See: logConfigCloudAuditOptions smart constructor.

Instances
Eq LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: LogConfigCloudAuditOptions -> Constr #

dataTypeOf :: LogConfigCloudAuditOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep LogConfigCloudAuditOptions :: Type -> Type #

ToJSON LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfigCloudAuditOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfigCloudAuditOptions = D1 (MetaData "LogConfigCloudAuditOptions" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "LogConfigCloudAuditOptions'" PrefixI True) (S1 (MetaSel (Just "_lccaoAuthorizationLoggingOptions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AuthorizationLoggingOptions)) :*: S1 (MetaSel (Just "_lccaoLogName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

logConfigCloudAuditOptions :: LogConfigCloudAuditOptions Source #

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

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

lccaoLogName :: Lens' LogConfigCloudAuditOptions (Maybe Text) Source #

The log_name to populate in the Cloud Audit Record.

Resource

data Resource Source #

See: resource smart constructor.

Instances
Eq Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: Resource -> Constr #

dataTypeOf :: Resource -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Resource :: Type -> Type #

Methods

from :: Resource -> Rep Resource x #

to :: Rep Resource x -> Resource #

ToJSON Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Resource Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Resource = D1 (MetaData "Resource" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Resource'" PrefixI True) (((S1 (MetaSel (Just "_rInsertTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rAccessControl") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ResourceAccessControl)) :*: S1 (MetaSel (Just "_rURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_rWarnings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ResourceWarningsItem])) :*: (S1 (MetaSel (Just "_rUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_rManifest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rFinalProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))))) :*: (S1 (MetaSel (Just "_rType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rUpdate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ResourceUpdate)) :*: S1 (MetaSel (Just "_rProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

resource :: Resource Source #

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

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

rInsertTime :: Lens' Resource (Maybe Text) Source #

Output only. Creation timestamp in RFC3339 text format.

rAccessControl :: Lens' Resource (Maybe ResourceAccessControl) Source #

The Access Control Policy set on this resource.

rURL :: Lens' Resource (Maybe Text) Source #

Output only. The URL of the actual resource.

rWarnings :: Lens' Resource [ResourceWarningsItem] Source #

Output only. If warning messages are generated during processing of this resource, this field will be populated.

rUpdateTime :: Lens' Resource (Maybe Text) Source #

Output only. Update timestamp in RFC3339 text format.

rName :: Lens' Resource (Maybe Text) Source #

Output only. The name of the resource as it appears in the YAML config.

rManifest :: Lens' Resource (Maybe Text) Source #

Output only. URL of the manifest representing the current configuration of this resource.

rFinalProperties :: Lens' Resource (Maybe Text) Source #

Output only. The evaluated properties of the resource with references expanded. Returned as serialized YAML.

rType :: Lens' Resource (Maybe Text) Source #

Output only. The type of the resource, for example compute.v1.instance, or cloudfunctions.v1beta1.function.

rUpdate :: Lens' Resource (Maybe ResourceUpdate) Source #

Output only. If Deployment Manager is currently updating or previewing an update to this resource, the updated configuration appears here.

rProperties :: Lens' Resource (Maybe Text) Source #

Output only. The current properties of the resource before any references have been filled in. Returned as serialized YAML.

LogConfigDataAccessOptions

data LogConfigDataAccessOptions Source #

Write a Data Access (Gin) log

See: logConfigDataAccessOptions smart constructor.

Instances
Eq LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: LogConfigDataAccessOptions -> Constr #

dataTypeOf :: LogConfigDataAccessOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep LogConfigDataAccessOptions :: Type -> Type #

ToJSON LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfigDataAccessOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfigDataAccessOptions = D1 (MetaData "LogConfigDataAccessOptions" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "LogConfigDataAccessOptions'" PrefixI True) (S1 (MetaSel (Just "_lcdaoLogMode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

logConfigDataAccessOptions :: LogConfigDataAccessOptions Source #

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

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

lcdaoLogMode :: Lens' LogConfigDataAccessOptions (Maybe Text) Source #

Whether Gin logging should happen in a fail-closed manner at the caller. This is relevant only in the LocalIAM implementation, for now. NOTE: Logging to Gin in a fail-closed manner is currently unsupported while work is being done to satisfy the requirements of go/345. Currently, setting LOG_FAIL_CLOSED mode will have no effect, but still exists because there is active work being done to support it (b/115874152).

DeploymentUpdateLabelEntry

data DeploymentUpdateLabelEntry Source #

Instances
Eq DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: DeploymentUpdateLabelEntry -> Constr #

dataTypeOf :: DeploymentUpdateLabelEntry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep DeploymentUpdateLabelEntry :: Type -> Type #

ToJSON DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentUpdateLabelEntry Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentUpdateLabelEntry = D1 (MetaData "DeploymentUpdateLabelEntry" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DeploymentUpdateLabelEntry'" PrefixI True) (S1 (MetaSel (Just "_duleValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_duleKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

deploymentUpdateLabelEntry :: DeploymentUpdateLabelEntry Source #

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

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

ResourceUpdateErrorErrorsItem

data ResourceUpdateErrorErrorsItem Source #

Instances
Eq ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceUpdateErrorErrorsItem -> Constr #

dataTypeOf :: ResourceUpdateErrorErrorsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceUpdateErrorErrorsItem :: Type -> Type #

ToJSON ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateErrorErrorsItem = D1 (MetaData "ResourceUpdateErrorErrorsItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ResourceUpdateErrorErrorsItem'" PrefixI True) (S1 (MetaSel (Just "_rueeiLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rueeiCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rueeiMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

resourceUpdateErrorErrorsItem :: ResourceUpdateErrorErrorsItem Source #

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

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

rueeiLocation :: Lens' ResourceUpdateErrorErrorsItem (Maybe Text) Source #

Output Only
Indicates the field in the request that caused the error. This property is optional.

rueeiCode :: Lens' ResourceUpdateErrorErrorsItem (Maybe Text) Source #

Output Only
The error type identifier for this error.

rueeiMessage :: Lens' ResourceUpdateErrorErrorsItem (Maybe Text) Source #

Output Only
An optional, human-readable error message.

ManifestsListResponse

data ManifestsListResponse Source #

A response containing a partial list of manifests and a page token used to build the next request if the request has been truncated.

See: manifestsListResponse smart constructor.

Instances
Eq ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ManifestsListResponse -> Constr #

dataTypeOf :: ManifestsListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ManifestsListResponse :: Type -> Type #

ToJSON ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ManifestsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ManifestsListResponse = D1 (MetaData "ManifestsListResponse" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ManifestsListResponse'" PrefixI True) (S1 (MetaSel (Just "_mlrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_mlrManifests") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Manifest]))))

manifestsListResponse :: ManifestsListResponse Source #

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

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

mlrNextPageToken :: Lens' ManifestsListResponse (Maybe Text) Source #

Output only. A token used to continue a truncated list request.

mlrManifests :: Lens' ManifestsListResponse [Manifest] Source #

Output only. Manifests contained in this list response.

OperationError

data OperationError Source #

Output Only
If errors are generated during processing of the operation, this field will be populated.

See: operationError smart constructor.

Instances
Eq OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: OperationError -> Constr #

dataTypeOf :: OperationError -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep OperationError :: Type -> Type #

ToJSON OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationError = D1 (MetaData "OperationError" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "OperationError'" PrefixI True) (S1 (MetaSel (Just "_oeErrors") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [OperationErrorErrorsItem]))))

operationError :: OperationError Source #

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

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

oeErrors :: Lens' OperationError [OperationErrorErrorsItem] Source #

Output Only
The array of errors encountered while processing this operation.

GlobalSetPolicyRequest

data GlobalSetPolicyRequest Source #

Instances
Eq GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: GlobalSetPolicyRequest -> Constr #

dataTypeOf :: GlobalSetPolicyRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep GlobalSetPolicyRequest :: Type -> Type #

ToJSON GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep GlobalSetPolicyRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep GlobalSetPolicyRequest = D1 (MetaData "GlobalSetPolicyRequest" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "GlobalSetPolicyRequest'" PrefixI True) (S1 (MetaSel (Just "_gsprEtag") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: (S1 (MetaSel (Just "_gsprBindings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Binding])) :*: S1 (MetaSel (Just "_gsprPolicy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Policy)))))

globalSetPolicyRequest :: GlobalSetPolicyRequest Source #

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

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

gsprEtag :: Lens' GlobalSetPolicyRequest (Maybe ByteString) Source #

Flatten Policy to create a backward compatible wire-format. Deprecated. Use 'policy' to specify the etag.

gsprBindings :: Lens' GlobalSetPolicyRequest [Binding] Source #

Flatten Policy to create a backward compatible wire-format. Deprecated. Use 'policy' to specify bindings.

gsprPolicy :: Lens' GlobalSetPolicyRequest (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 in general a valid policy but certain services (like Projects) might reject them.

AuthorizationLoggingOptions

data AuthorizationLoggingOptions Source #

Authorization-related information used by Cloud Audit Logging.

See: authorizationLoggingOptions smart constructor.

Instances
Eq AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: AuthorizationLoggingOptions -> Constr #

dataTypeOf :: AuthorizationLoggingOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep AuthorizationLoggingOptions :: Type -> Type #

ToJSON AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep AuthorizationLoggingOptions Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep AuthorizationLoggingOptions = D1 (MetaData "AuthorizationLoggingOptions" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "AuthorizationLoggingOptions'" PrefixI True) (S1 (MetaSel (Just "_aloPermissionType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

authorizationLoggingOptions :: AuthorizationLoggingOptions Source #

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

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

aloPermissionType :: Lens' AuthorizationLoggingOptions (Maybe Text) Source #

The type of the permission that was checked.

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

Methods

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

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

Data Policy Source # 
Instance details

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

Generic Policy Source # 
Instance details

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

FromJSON Policy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Policy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Policy = D1 (MetaData "Policy" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" 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 "_pRules") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Rule])))) :*: (S1 (MetaSel (Just "_pVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_pBindings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Binding])) :*: S1 (MetaSel (Just "_pIAMOwned") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))

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.

pRules :: Lens' Policy [Rule] Source #

If more than one rule is specified, the rules are applied in the following manner: - All matching LOG rules are always applied. - If any DENY/DENY_WITH_LOG rule matches, permission is denied. Logging will be applied if one or more matching rule requires logging. - Otherwise, if any ALLOW/ALLOW_WITH_LOG rule matches, permission is granted. Logging will be applied if one or more matching rule requires logging. - Otherwise, if no rule applies, permission is denied.

pBindings :: Lens' Policy [Binding] Source #

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

Type

data Type Source #

A resource type supported by Deployment Manager.

See: type' smart constructor.

Instances
Eq Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

Data Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: Type -> Constr #

dataTypeOf :: Type -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Generic Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Type :: Type -> Type #

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

ToJSON Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Type Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Type = D1 (MetaData "Type" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Type'" PrefixI True) ((S1 (MetaSel (Just "_tInsertTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tOperation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Operation))) :*: (S1 (MetaSel (Just "_tSelfLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_tName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64)))))))

type' :: Type Source #

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

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

tInsertTime :: Lens' Type (Maybe Text) Source #

Output only. Creation timestamp in RFC3339 text format.

tOperation :: Lens' Type (Maybe Operation) Source #

Output only. The Operation that most recently ran, or is currently running, on this type.

tSelfLink :: Lens' Type (Maybe Text) Source #

Output only. Server defined URL for the resource.

tName :: Lens' Type (Maybe Text) Source #

Name of the type.

ImportFile

data ImportFile Source #

See: importFile smart constructor.

Instances
Eq ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ImportFile -> Constr #

dataTypeOf :: ImportFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ImportFile :: Type -> Type #

ToJSON ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ImportFile Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ImportFile = D1 (MetaData "ImportFile" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ImportFile'" PrefixI True) (S1 (MetaSel (Just "_ifContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ifName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

importFile :: ImportFile Source #

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

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

ifContent :: Lens' ImportFile (Maybe Text) Source #

The contents of the file.

ifName :: Lens' ImportFile (Maybe Text) Source #

The name of the file.

OperationErrorErrorsItem

data OperationErrorErrorsItem Source #

Instances
Eq OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: OperationErrorErrorsItem -> Constr #

dataTypeOf :: OperationErrorErrorsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep OperationErrorErrorsItem :: Type -> Type #

ToJSON OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationErrorErrorsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationErrorErrorsItem = D1 (MetaData "OperationErrorErrorsItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "OperationErrorErrorsItem'" PrefixI True) (S1 (MetaSel (Just "_oeeiLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_oeeiCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_oeeiMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

operationErrorErrorsItem :: OperationErrorErrorsItem Source #

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

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

oeeiLocation :: Lens' OperationErrorErrorsItem (Maybe Text) Source #

Output Only
Indicates the field in the request that caused the error. This property is optional.

oeeiCode :: Lens' OperationErrorErrorsItem (Maybe Text) Source #

Output Only
The error type identifier for this error.

oeeiMessage :: Lens' OperationErrorErrorsItem (Maybe Text) Source #

Output Only
An optional, human-readable error message.

DeploymentsStopRequest

data DeploymentsStopRequest Source #

See: deploymentsStopRequest smart constructor.

Instances
Eq DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: DeploymentsStopRequest -> Constr #

dataTypeOf :: DeploymentsStopRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep DeploymentsStopRequest :: Type -> Type #

ToJSON DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentsStopRequest Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentsStopRequest = D1 (MetaData "DeploymentsStopRequest" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "DeploymentsStopRequest'" PrefixI True) (S1 (MetaSel (Just "_dsrFingerprint") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bytes))))

deploymentsStopRequest :: DeploymentsStopRequest Source #

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

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

dsrFingerprint :: Lens' DeploymentsStopRequest (Maybe ByteString) Source #

Specifies a fingerprint for stop() requests. A fingerprint is a randomly generated value that must be provided in stop() requests to perform optimistic locking. This ensures optimistic concurrency so that the deployment does not have conflicting requests (e.g. if someone attempts to make a new update request while another user attempts to stop an ongoing update request, this would prevent a collision). The fingerprint is initially generated by Deployment Manager and changes after every request to modify a deployment. To get the latest fingerprint value, perform a get() request on the deployment.

ResourceWarningsItemDataItem

data ResourceWarningsItemDataItem Source #

Instances
Eq ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceWarningsItemDataItem -> Constr #

dataTypeOf :: ResourceWarningsItemDataItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceWarningsItemDataItem :: Type -> Type #

ToJSON ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceWarningsItemDataItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceWarningsItemDataItem = D1 (MetaData "ResourceWarningsItemDataItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ResourceWarningsItemDataItem'" PrefixI True) (S1 (MetaSel (Just "_rwidiValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rwidiKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

resourceWarningsItemDataItem :: ResourceWarningsItemDataItem Source #

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

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

rwidiValue :: Lens' ResourceWarningsItemDataItem (Maybe Text) Source #

Output Only
A warning data value corresponding to the key.

rwidiKey :: Lens' ResourceWarningsItemDataItem (Maybe Text) Source #

Output Only
A key that provides more detail on the warning being returned. For example, for warnings where there are no results in a list request for a particular zone, this key might be scope and the key value might be the zone name. Other examples might be a key indicating a deprecated resource and a suggested replacement, or a warning about invalid network settings (for example, if an instance attempts to perform IP forwarding but is not enabled for IP forwarding).

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

Data AuditLogConfig Source # 
Instance details

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

Generic AuditLogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep AuditLogConfig :: Type -> Type #

ToJSON AuditLogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON AuditLogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep AuditLogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep AuditLogConfig = D1 (MetaData "AuditLogConfig" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "AuditLogConfig'" PrefixI True) (S1 (MetaSel (Just "_alcLogType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: 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 Text) 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][].

ResourceUpdateError

data ResourceUpdateError Source #

Output only. If errors are generated during update of the resource, this field will be populated.

See: resourceUpdateError smart constructor.

Instances
Eq ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceUpdateError -> Constr #

dataTypeOf :: ResourceUpdateError -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceUpdateError :: Type -> Type #

ToJSON ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateError Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceUpdateError = D1 (MetaData "ResourceUpdateError" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "ResourceUpdateError'" PrefixI True) (S1 (MetaSel (Just "_rueErrors") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ResourceUpdateErrorErrorsItem]))))

resourceUpdateError :: ResourceUpdateError Source #

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

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

rueErrors :: Lens' ResourceUpdateError [ResourceUpdateErrorErrorsItem] Source #

Output Only
The array of errors encountered while processing this operation.

Condition

data Condition Source #

A condition to be met.

See: condition smart constructor.

Instances
Eq Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: Condition -> Constr #

dataTypeOf :: Condition -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Condition :: Type -> Type #

ToJSON Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Condition Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

condition :: Condition Source #

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

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

cOp :: Lens' Condition (Maybe Text) Source #

An operator to apply the subject with.

cIAM :: Lens' Condition (Maybe Text) Source #

Trusted attributes supplied by the IAM system.

cValues :: Lens' Condition [Text] Source #

The objects of the condition. This is mutually exclusive with 'value'.

cValue :: Lens' Condition (Maybe Text) Source #

DEPRECATED. Use 'values' instead.

cSys :: Lens' Condition (Maybe Text) Source #

Trusted attributes supplied by any service that owns resources and uses the IAM system for access control.

cSvc :: Lens' Condition (Maybe Text) Source #

Trusted attributes discharged by the service.

DeploymentsListResponse

data DeploymentsListResponse Source #

A response containing a partial list of deployments and a page token used to build the next request if the request has been truncated.

See: deploymentsListResponse smart constructor.

Instances
Eq DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: DeploymentsListResponse -> Constr #

dataTypeOf :: DeploymentsListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep DeploymentsListResponse :: Type -> Type #

ToJSON DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentsListResponse Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep DeploymentsListResponse = D1 (MetaData "DeploymentsListResponse" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DeploymentsListResponse'" PrefixI True) (S1 (MetaSel (Just "_dlrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dlrDeployments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Deployment]))))

deploymentsListResponse :: DeploymentsListResponse Source #

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

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

dlrNextPageToken :: Lens' DeploymentsListResponse (Maybe Text) Source #

Output only. A token used to continue a truncated list request.

dlrDeployments :: Lens' DeploymentsListResponse [Deployment] Source #

Output only. The deployments contained in this response.

ResourceWarningsItem

data ResourceWarningsItem Source #

Instances
Eq ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceWarningsItem -> Constr #

dataTypeOf :: ResourceWarningsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceWarningsItem :: Type -> Type #

ToJSON ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceWarningsItem = D1 (MetaData "ResourceWarningsItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "ResourceWarningsItem'" PrefixI True) (S1 (MetaSel (Just "_rwiData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ResourceWarningsItemDataItem])) :*: (S1 (MetaSel (Just "_rwiCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rwiMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

resourceWarningsItem :: ResourceWarningsItem Source #

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

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

rwiData :: Lens' ResourceWarningsItem [ResourceWarningsItemDataItem] Source #

Output Only
Metadata about this warning in key: value format. For example: "data": [ { "key": "scope", "value": "zones/us-east1-d" }

rwiCode :: Lens' ResourceWarningsItem (Maybe Text) Source #

Output Only
A warning code, if applicable. For example, Compute Engine returns NO_RESULTS_ON_PAGE if there are no results in the response.

rwiMessage :: Lens' ResourceWarningsItem (Maybe Text) Source #

Output Only
A human-readable description of the warning code.

LogConfig

data LogConfig Source #

Specifies what kind of log the caller must write

See: logConfig smart constructor.

Instances
Eq LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: LogConfig -> Constr #

dataTypeOf :: LogConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep LogConfig :: Type -> Type #

ToJSON LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfig Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep LogConfig = D1 (MetaData "LogConfig" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "LogConfig'" PrefixI True) (S1 (MetaSel (Just "_lcCloudAudit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LogConfigCloudAuditOptions)) :*: (S1 (MetaSel (Just "_lcDataAccess") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LogConfigDataAccessOptions)) :*: S1 (MetaSel (Just "_lcCounter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LogConfigCounterOptions)))))

logConfig :: LogConfig Source #

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

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

ResourceAccessControl

data ResourceAccessControl Source #

The access controls set on the resource.

See: resourceAccessControl smart constructor.

Instances
Eq ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: ResourceAccessControl -> Constr #

dataTypeOf :: ResourceAccessControl -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep ResourceAccessControl :: Type -> Type #

ToJSON ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceAccessControl Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep ResourceAccessControl = D1 (MetaData "ResourceAccessControl" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" True) (C1 (MetaCons "ResourceAccessControl'" PrefixI True) (S1 (MetaSel (Just "_racGcpIAMPolicy") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

resourceAccessControl :: ResourceAccessControl Source #

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

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

racGcpIAMPolicy :: Lens' ResourceAccessControl (Maybe Text) Source #

The GCP IAM Policy to set on the resource.

TargetConfiguration

data TargetConfiguration Source #

See: targetConfiguration smart constructor.

Instances
Eq TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: TargetConfiguration -> Constr #

dataTypeOf :: TargetConfiguration -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep TargetConfiguration :: Type -> Type #

ToJSON TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TargetConfiguration Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep TargetConfiguration = D1 (MetaData "TargetConfiguration" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "TargetConfiguration'" PrefixI True) (S1 (MetaSel (Just "_tcConfig") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ConfigFile)) :*: S1 (MetaSel (Just "_tcImports") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ImportFile]))))

targetConfiguration :: TargetConfiguration Source #

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

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

tcConfig :: Lens' TargetConfiguration (Maybe ConfigFile) Source #

The configuration to use for this deployment.

tcImports :: Lens' TargetConfiguration [ImportFile] Source #

Specifies any files to import for this configuration. This can be used to import templates or other files. For example, you might import a text file in order to use the file in a template.

OperationWarningsItem

data OperationWarningsItem Source #

Instances
Eq OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: OperationWarningsItem -> Constr #

dataTypeOf :: OperationWarningsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep OperationWarningsItem :: Type -> Type #

ToJSON OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationWarningsItem Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep OperationWarningsItem = D1 (MetaData "OperationWarningsItem" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "OperationWarningsItem'" PrefixI True) (S1 (MetaSel (Just "_owiData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [OperationWarningsItemDataItem])) :*: (S1 (MetaSel (Just "_owiCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_owiMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

operationWarningsItem :: OperationWarningsItem Source #

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

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

owiData :: Lens' OperationWarningsItem [OperationWarningsItemDataItem] Source #

Output Only
Metadata about this warning in key: value format. For example: "data": [ { "key": "scope", "value": "zones/us-east1-d" }

owiCode :: Lens' OperationWarningsItem (Maybe Text) Source #

Output Only
A warning code, if applicable. For example, Compute Engine returns NO_RESULTS_ON_PAGE if there are no results in the response.

owiMessage :: Lens' OperationWarningsItem (Maybe Text) Source #

Output Only
A human-readable description of the warning code.

Binding

data Binding Source #

Associates `members` with a `role`.

See: binding smart constructor.

Instances
Eq Binding Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

Data Binding Source # 
Instance details

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

Generic Binding Source # 
Instance details

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

FromJSON Binding Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Binding Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Binding = D1 (MetaData "Binding" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" 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.

Deployment

data Deployment Source #

See: deployment smart constructor.

Instances
Eq Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Data Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Methods

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

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

toConstr :: Deployment -> Constr #

dataTypeOf :: Deployment -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Generic Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

Associated Types

type Rep Deployment :: Type -> Type #

ToJSON Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

FromJSON Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Deployment Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Product

type Rep Deployment = D1 (MetaData "Deployment" "Network.Google.DeploymentManager.Types.Product" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "Deployment'" PrefixI True) (((S1 (MetaSel (Just "_dInsertTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dOperation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Operation)) :*: S1 (MetaSel (Just "_dFingerprint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)))) :*: (S1 (MetaSel (Just "_dUpdateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dSelfLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_dManifest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_dLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DeploymentLabelEntry])))) :*: (S1 (MetaSel (Just "_dDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dUpdate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeploymentUpdate)) :*: S1 (MetaSel (Just "_dTarget") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TargetConfiguration)))))))

deployment :: Deployment Source #

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

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

dInsertTime :: Lens' Deployment (Maybe Text) Source #

Output only. Creation timestamp in RFC3339 text format.

dOperation :: Lens' Deployment (Maybe Operation) Source #

Output only. The Operation that most recently ran, or is currently running, on this deployment.

dFingerprint :: Lens' Deployment (Maybe ByteString) Source #

Provides a fingerprint to use in requests to modify a deployment, such as update(), stop(), and cancelPreview() requests. A fingerprint is a randomly generated value that must be provided with update(), stop(), and cancelPreview() requests to perform optimistic locking. This ensures optimistic concurrency so that only one request happens at a time. The fingerprint is initially generated by Deployment Manager and changes after every request to modify data. To get the latest fingerprint value, perform a get() request to a deployment.

dUpdateTime :: Lens' Deployment (Maybe Text) Source #

Output only. Update timestamp in RFC3339 text format.

dSelfLink :: Lens' Deployment (Maybe Text) Source #

Output only. Server defined URL for the resource.

dName :: Lens' Deployment (Maybe Text) Source #

Name of the resource; provided by the client when the resource is created. The name must be 1-63 characters long, and comply with RFC1035. Specifically, the name must be 1-63 characters long and match the regular expression a-z? which means the first character must be a lowercase letter, and all following characters must be a dash, lowercase letter, or digit, except the last character, which cannot be a dash.

dManifest :: Lens' Deployment (Maybe Text) Source #

Output only. URL of the manifest representing the last manifest that was successfully deployed.

dLabels :: Lens' Deployment [DeploymentLabelEntry] Source #

Map of labels; provided by the client when the resource is created or updated. Specifically: Label keys must be between 1 and 63 characters long and must conform to the following regular expression: a-z? Label values must be between 0 and 63 characters long and must conform to the regular expression ([a-z]([-a-z0-9]*[a-z0-9])?)?

dDescription :: Lens' Deployment (Maybe Text) Source #

An optional user-provided description of the deployment.

dUpdate :: Lens' Deployment (Maybe DeploymentUpdate) Source #

Output only. If Deployment Manager is currently updating or previewing an update to this deployment, the updated configuration appears here.

dTarget :: Lens' Deployment (Maybe TargetConfiguration) Source #

Input Only
The parameters that define your deployment, including the deployment configuration and relevant templates.

DeploymentsInsertCreatePolicy

data DeploymentsInsertCreatePolicy Source #

Sets the policy to use for creating new resources.

Constructors

DICPAcquire
ACQUIRE
DICPCreateOrAcquire
CREATE_OR_ACQUIRE
Instances
Enum DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Eq DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Data DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Methods

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

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

toConstr :: DeploymentsInsertCreatePolicy -> Constr #

dataTypeOf :: DeploymentsInsertCreatePolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Read DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Show DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Generic DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

Associated Types

type Rep DeploymentsInsertCreatePolicy :: Type -> Type #

Hashable DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToJSON DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromJSON DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

FromHttpApiData DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

ToHttpApiData DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsInsertCreatePolicy Source # 
Instance details

Defined in Network.Google.DeploymentManager.Types.Sum

type Rep DeploymentsInsertCreatePolicy = D1 (MetaData "DeploymentsInsertCreatePolicy" "Network.Google.DeploymentManager.Types.Sum" "gogol-deploymentmanager-0.4.0-1FvxHucO1CjAgqyDzotDSh" False) (C1 (MetaCons "DICPAcquire" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DICPCreateOrAcquire" PrefixI False) (U1 :: Type -> Type))