{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.ReplicaPool.Types
(
replicaPoolService
, cloudPlatformReadOnlyScope
, cloudPlatformScope
, ndevCloudmanScope
, ndevCloudmanReadOnlyScope
, replicaPoolScope
, replicaPoolReadOnlyScope
, ReplicaStatus
, replicaStatus
, rsState
, rsTemplateVersion
, rsVMLink
, rsVMStartTime
, rsDetails
, DiskAttachment
, diskAttachment
, daDeviceName
, daIndex
, PoolsDeleteRequest
, poolsDeleteRequest
, pdrAbandonInstances
, HealthCheck
, healthCheck
, hcHealthyThreshold
, hcPath
, hcCheckIntervalSec
, hcName
, hcHost
, hcTimeoutSec
, hcDescription
, hcUnhealthyThreshold
, hcPort
, Tag
, tag
, tFingerPrint
, tItems
, NewDiskInitializeParams
, newDiskInitializeParams
, ndipSourceImage
, ndipDiskSizeGb
, ndipDiskType
, MetadataItem
, metadataItem
, miValue
, miKey
, Replica
, replica
, rStatus
, rSelfLink
, rName
, NetworkInterface
, networkInterface
, niNetwork
, niNetworkIP
, niAccessConfigs
, ExistingDisk
, existingDisk
, edAttachment
, edSource
, Action
, action
, aCommands
, aTimeoutMilliSeconds
, aEnvVariables
, Pool
, pool
, pResourceViews
, pNumReplicas
, pTargetPool
, pAutoRestart
, pBaseInstanceName
, pInitialNumReplicas
, pCurrentNumReplicas
, pSelfLink
, pName
, pLabels
, pType
, pTemplate
, pTargetPools
, pDescription
, pHealthChecks
, ServiceAccount
, serviceAccount
, saEmail
, saScopes
, VMParams
, vMParams
, vmpServiceAccounts
, vmpNetworkInterfaces
, vmpBaseInstanceName
, vmpOnHostMaintenance
, vmpMachineType
, vmpMetadata
, vmpDisksToAttach
, vmpCanIPForward
, vmpDescription
, vmpDisksToCreate
, vmpTags
, ReplicasListResponse
, replicasListResponse
, rlrNextPageToken
, rlrResources
, Metadata
, metadata
, mFingerPrint
, mItems
, Template
, template
, tAction
, tVMParams
, tVersion
, tHealthChecks
, EnvVariable
, envVariable
, evValue
, evName
, evHidden
, ReplicasDeleteRequest
, replicasDeleteRequest
, rdrAbandonInstance
, AccessConfig
, accessConfig
, acName
, acNATIP
, acType
, Label
, label
, lValue
, lKey
, PoolsListResponse
, poolsListResponse
, plrNextPageToken
, plrResources
, NewDisk
, newDisk
, ndBoot
, ndAutoDelete
, ndAttachment
, ndInitializeParams
) where
import Network.Google.Prelude
import Network.Google.ReplicaPool.Types.Product
import Network.Google.ReplicaPool.Types.Sum
replicaPoolService :: ServiceConfig
replicaPoolService
= defaultService (ServiceId "replicapool:v1beta1")
"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;
replicaPoolScope :: Proxy '["https://www.googleapis.com/auth/replicapool"]
replicaPoolScope = Proxy;
replicaPoolReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/replicapool.readonly"]
replicaPoolReadOnlyScope = Proxy;