{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.BigtableAdmin.Types
(
bigtableAdminService
, bigtableAdminClusterScope
, cloudBigtableAdminTableScope
, cloudPlatformReadOnlyScope
, bigtableAdminScope
, cloudPlatformScope
, cloudBigtableAdminScope
, cloudBigtableAdminClusterScope
, bigtableAdminTableScope
, bigtableAdminInstanceScope
, SingleClusterRouting
, singleClusterRouting
, scrAllowTransactionalWrites
, scrClusterId
, InstanceLabels
, instanceLabels
, ilAddtional
, Status
, status
, sDetails
, sCode
, sMessage
, CreateInstanceRequest
, createInstanceRequest
, cirParent
, cirInstanceId
, cirClusters
, cirInstance
, AuditConfig
, auditConfig
, acService
, acAuditLogConfigs
, GenerateConsistencyTokenRequest
, generateConsistencyTokenRequest
, ModifyColumnFamiliesRequest
, modifyColumnFamiliesRequest
, mcfrModifications
, Expr
, expr
, eLocation
, eExpression
, eTitle
, eDescription
, ListOperationsResponse
, listOperationsResponse
, lorNextPageToken
, lorOperations
, CreateClusterRequest
, createClusterRequest
, ccrParent
, ccrCluster
, ccrClusterId
, GetIAMPolicyRequest
, getIAMPolicyRequest
, Cluster
, cluster
, cState
, cDefaultStorageType
, cLocation
, cServeNodes
, cName
, Split
, split
, sKey
, MultiClusterRoutingUseAny
, multiClusterRoutingUseAny
, ClusterState
, clusterState
, csReplicationState
, Operation
, operation
, oDone
, oError
, oResponse
, oName
, oMetadata
, Empty
, empty
, ClusterDefaultStorageType (..)
, ListAppProFilesResponse
, listAppProFilesResponse
, lapfrNextPageToken
, lapfrFailedLocations
, lapfrAppProFiles
, TableClusterStates
, tableClusterStates
, tcsAddtional
, TableColumnFamilies
, tableColumnFamilies
, tcfAddtional
, CreateTableRequest
, createTableRequest
, ctrInitialSplits
, ctrTableId
, ctrTable
, CreateClusterMetadata
, createClusterMetadata
, ccmRequestTime
, ccmOriginalRequest
, ccmFinishTime
, Union
, union
, uRules
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, UpdateAppProFileMetadata
, updateAppProFileMetadata
, UpdateClusterMetadata
, updateClusterMetadata
, ucmRequestTime
, ucmOriginalRequest
, ucmFinishTime
, ClusterStateReplicationState (..)
, SetIAMPolicyRequest
, setIAMPolicyRequest
, siprUpdateMask
, siprPolicy
, InstanceType (..)
, CheckConsistencyRequest
, checkConsistencyRequest
, ccrConsistencyToken
, ListTablesResponse
, listTablesResponse
, ltrNextPageToken
, ltrTables
, AuditLogConfigLogType (..)
, PartialUpdateInstanceRequest
, partialUpdateInstanceRequest
, puirUpdateMask
, puirInstance
, Xgafv (..)
, TableGranularity (..)
, GcRule
, gcRule
, grMaxAge
, grUnion
, grIntersection
, grMaxNumVersions
, TestIAMPermissionsRequest
, testIAMPermissionsRequest
, tiprPermissions
, ClusterType (..)
, AppProFile
, appProFile
, apfSingleClusterRouting
, apfEtag
, apfMultiClusterRoutingUseAny
, apfName
, apfDescription
, CreateInstanceRequestClusters
, createInstanceRequestClusters
, circAddtional
, GenerateConsistencyTokenResponse
, generateConsistencyTokenResponse
, gctrConsistencyToken
, DropRowRangeRequest
, dropRowRangeRequest
, drrrRowKeyPrefix
, drrrDeleteAllDataFromTable
, UpdateInstanceMetadata
, updateInstanceMetadata
, uimRequestTime
, uimOriginalRequest
, uimFinishTime
, Intersection
, intersection
, iRules
, ColumnFamily
, columnFamily
, cfGcRule
, TestIAMPermissionsResponse
, testIAMPermissionsResponse
, tiamprPermissions
, ListClustersResponse
, listClustersResponse
, lcrNextPageToken
, lcrFailedLocations
, lcrClusters
, Policy
, policy
, pAuditConfigs
, pEtag
, pVersion
, pBindings
, CreateInstanceMetadata
, createInstanceMetadata
, cimRequestTime
, cimOriginalRequest
, cimFinishTime
, OperationMetadata
, operationMetadata
, omAddtional
, AuditLogConfig
, auditLogConfig
, alcLogType
, alcExemptedMembers
, ListInstancesResponse
, listInstancesResponse
, lirNextPageToken
, lirFailedLocations
, lirInstances
, CheckConsistencyResponse
, checkConsistencyResponse
, ccrConsistent
, InstanceState (..)
, Modification
, modification
, mDrop
, mCreate
, mId
, mUpdate
, Table
, table
, tGranularity
, tName
, tClusterStates
, tColumnFamilies
, OperationResponse
, operationResponse
, orAddtional
, Binding
, binding
, bMembers
, bRole
, bCondition
, Instance
, instance'
, iState
, iName
, iDisplayName
, iLabels
, iType
) where
import Network.Google.BigtableAdmin.Types.Product
import Network.Google.BigtableAdmin.Types.Sum
import Network.Google.Prelude
bigtableAdminService :: ServiceConfig
bigtableAdminService
= defaultService (ServiceId "bigtableadmin:v2")
"bigtableadmin.googleapis.com"
bigtableAdminClusterScope :: Proxy '["https://www.googleapis.com/auth/bigtable.admin.cluster"]
bigtableAdminClusterScope = Proxy;
cloudBigtableAdminTableScope :: Proxy '["https://www.googleapis.com/auth/cloud-bigtable.admin.table"]
cloudBigtableAdminTableScope = Proxy;
cloudPlatformReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform.read-only"]
cloudPlatformReadOnlyScope = Proxy;
bigtableAdminScope :: Proxy '["https://www.googleapis.com/auth/bigtable.admin"]
bigtableAdminScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;
cloudBigtableAdminScope :: Proxy '["https://www.googleapis.com/auth/cloud-bigtable.admin"]
cloudBigtableAdminScope = Proxy;
cloudBigtableAdminClusterScope :: Proxy '["https://www.googleapis.com/auth/cloud-bigtable.admin.cluster"]
cloudBigtableAdminClusterScope = Proxy;
bigtableAdminTableScope :: Proxy '["https://www.googleapis.com/auth/bigtable.admin.table"]
bigtableAdminTableScope = Proxy;
bigtableAdminInstanceScope :: Proxy '["https://www.googleapis.com/auth/bigtable.admin.instance"]
bigtableAdminInstanceScope = Proxy;