{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.DeploymentManager.Types
(
deploymentManagerService
, cloudPlatformReadOnlyScope
, cloudPlatformScope
, ndevCloudmanScope
, ndevCloudmanReadOnlyScope
, OperationWarningsItemDataItem
, operationWarningsItemDataItem
, owidiValue
, owidiKey
, ConfigFile
, configFile
, cfContent
, AuditConfig
, auditConfig
, acService
, acAuditLogConfigs
, acExemptedMembers
, DeploymentsUpdateCreatePolicy (..)
, Expr
, expr
, eLocation
, eExpression
, eTitle
, eDescription
, OperationsListResponse
, operationsListResponse
, olrNextPageToken
, olrOperations
, ResourceUpdateWarningsItemDataItem
, resourceUpdateWarningsItemDataItem
, ruwidiValue
, ruwidiKey
, DeploymentsDeleteDeletePolicy (..)
, TypesListResponse
, typesListResponse
, tlrNextPageToken
, tlrTypes
, LogConfigCounterOptions
, logConfigCounterOptions
, lccoField
, lccoMetric
, DeploymentsUpdateDeletePolicy (..)
, DeploymentsPatchDeletePolicy (..)
, Operation
, operation
, oTargetId
, oStatus
, oInsertTime
, oProgress
, oStartTime
, oKind
, oError
, oHTTPErrorMessage
, oZone
, oWarnings
, oHTTPErrorStatusCode
, oUser
, oSelfLink
, oName
, oStatusMessage
, oCreationTimestamp
, oEndTime
, oId
, oOperationType
, oRegion
, oDescription
, oTargetLink
, oClientOperationId
, TestPermissionsResponse
, testPermissionsResponse
, tprPermissions
, DeploymentsPatchCreatePolicy (..)
, ResourcesListResponse
, resourcesListResponse
, rlrNextPageToken
, rlrResources
, DeploymentUpdate
, deploymentUpdate
, duManifest
, duLabels
, duDescription
, ResourceUpdate
, resourceUpdate
, ruState
, ruError
, ruAccessControl
, ruWarnings
, ruIntent
, ruManifest
, ruFinalProperties
, ruProperties
, DeploymentLabelEntry
, deploymentLabelEntry
, dleValue
, dleKey
, Rule
, rule
, rAction
, rNotIns
, rIns
, rLogConfigs
, rConditions
, rPermissions
, rDescription
, TestPermissionsRequest
, testPermissionsRequest
, tPermissions
, Manifest
, manifest
, mInsertTime
, mLayout
, mConfig
, mExpandedConfig
, mImports
, mSelfLink
, mName
, mId
, ResourceUpdateWarningsItem
, resourceUpdateWarningsItem
, ruwiData
, ruwiCode
, ruwiMessage
, DeploymentsCancelPreviewRequest
, deploymentsCancelPreviewRequest
, dcprFingerprint
, LogConfigCloudAuditOptions
, logConfigCloudAuditOptions
, lccaoAuthorizationLoggingOptions
, lccaoLogName
, Resource
, resource
, rInsertTime
, rAccessControl
, rURL
, rWarnings
, rUpdateTime
, rName
, rManifest
, rFinalProperties
, rId
, rType
, rUpdate
, rProperties
, LogConfigDataAccessOptions
, logConfigDataAccessOptions
, lcdaoLogMode
, DeploymentUpdateLabelEntry
, deploymentUpdateLabelEntry
, duleValue
, duleKey
, ResourceUpdateErrorErrorsItem
, resourceUpdateErrorErrorsItem
, rueeiLocation
, rueeiCode
, rueeiMessage
, ManifestsListResponse
, manifestsListResponse
, mlrNextPageToken
, mlrManifests
, OperationError
, operationError
, oeErrors
, GlobalSetPolicyRequest
, globalSetPolicyRequest
, gsprEtag
, gsprBindings
, gsprPolicy
, AuthorizationLoggingOptions
, authorizationLoggingOptions
, aloPermissionType
, Policy
, policy
, pAuditConfigs
, pEtag
, pRules
, pVersion
, pBindings
, pIAMOwned
, Type
, type'
, tInsertTime
, tOperation
, tSelfLink
, tName
, tId
, ImportFile
, importFile
, ifContent
, ifName
, OperationErrorErrorsItem
, operationErrorErrorsItem
, oeeiLocation
, oeeiCode
, oeeiMessage
, DeploymentsStopRequest
, deploymentsStopRequest
, dsrFingerprint
, ResourceWarningsItemDataItem
, resourceWarningsItemDataItem
, rwidiValue
, rwidiKey
, AuditLogConfig
, auditLogConfig
, alcLogType
, alcExemptedMembers
, ResourceUpdateError
, resourceUpdateError
, rueErrors
, Condition
, condition
, cOp
, cIAM
, cValues
, cValue
, cSys
, cSvc
, DeploymentsListResponse
, deploymentsListResponse
, dlrNextPageToken
, dlrDeployments
, ResourceWarningsItem
, resourceWarningsItem
, rwiData
, rwiCode
, rwiMessage
, LogConfig
, logConfig
, lcCloudAudit
, lcDataAccess
, lcCounter
, ResourceAccessControl
, resourceAccessControl
, racGcpIAMPolicy
, TargetConfiguration
, targetConfiguration
, tcConfig
, tcImports
, OperationWarningsItem
, operationWarningsItem
, owiData
, owiCode
, owiMessage
, Binding
, binding
, bMembers
, bRole
, bCondition
, Deployment
, deployment
, dInsertTime
, dOperation
, dFingerprint
, dUpdateTime
, dSelfLink
, dName
, dManifest
, dId
, dLabels
, dDescription
, dUpdate
, dTarget
, DeploymentsInsertCreatePolicy (..)
) where
import Network.Google.DeploymentManager.Types.Product
import Network.Google.DeploymentManager.Types.Sum
import Network.Google.Prelude
deploymentManagerService :: ServiceConfig
deploymentManagerService
= defaultService (ServiceId "deploymentmanager:v2")
"www.googleapis.com"
cloudPlatformReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform.read-only"]
cloudPlatformReadOnlyScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;
ndevCloudmanScope :: Proxy '["https://www.googleapis.com/auth/ndev.cloudman"]
ndevCloudmanScope = Proxy;
ndevCloudmanReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/ndev.cloudman.readonly"]
ndevCloudmanReadOnlyScope = Proxy;