{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.ReplicaPoolUpdater
(
replicaPoolUpdaterService
, cloudPlatformReadOnlyScope
, cloudPlatformScope
, replicapoolScope
, replicapoolReadOnlyScope
, ReplicaPoolUpdaterAPI
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Cancel
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Get
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Insert
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.List
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.ListInstanceUpdates
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Pause
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Resume
, module Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Rollback
, module Network.Google.Resource.ReplicaPoolUpdater.ZoneOperations.Get
, module Network.Google.Resource.ReplicaPoolUpdater.ZoneOperations.List
, OperationWarningsItemDataItem
, operationWarningsItemDataItem
, owidiValue
, owidiKey
, RollingUpdate
, rollingUpdate
, ruStatus
, ruProgress
, ruInstanceGroupManager
, ruKind
, ruError
, ruInstanceTemplate
, ruUser
, ruSelfLink
, ruStatusMessage
, ruCreationTimestamp
, ruId
, ruPolicy
, ruActionType
, ruOldInstanceTemplate
, ruDescription
, ruInstanceGroup
, RollingUpdateError
, rollingUpdateError
, rueErrors
, OperationList
, operationList
, olNextPageToken
, olKind
, olItems
, olSelfLink
, olId
, InstanceUpdateList
, instanceUpdateList
, iulNextPageToken
, iulKind
, iulItems
, iulSelfLink
, RollingUpdateErrorErrorsItem
, rollingUpdateErrorErrorsItem
, rueeiLocation
, rueeiCode
, rueeiMessage
, Operation
, operation
, oTargetId
, oStatus
, oInsertTime
, oProgress
, oStartTime
, oKind
, oError
, oHTTPErrorMessage
, oZone
, oWarnings
, oHTTPErrorStatusCode
, oUser
, oSelfLink
, oName
, oStatusMessage
, oCreationTimestamp
, oEndTime
, oId
, oOperationType
, oRegion
, oTargetLink
, oClientOperationId
, InstanceUpdate
, instanceUpdate
, iuStatus
, iuError
, iuInstance
, InstanceUpdateError
, instanceUpdateError
, iueErrors
, RollingUpdatePolicy
, rollingUpdatePolicy
, rupMinInstanceUpdateTimeSec
, rupInstanceStartupTimeoutSec
, rupMaxNumFailedInstances
, rupAutoPauseAfterInstances
, rupMaxNumConcurrentInstances
, OperationError
, operationError
, oeErrors
, OperationErrorErrorsItem
, operationErrorErrorsItem
, oeeiLocation
, oeeiCode
, oeeiMessage
, InstanceUpdateErrorErrorsItem
, instanceUpdateErrorErrorsItem
, iueeiLocation
, iueeiCode
, iueeiMessage
, RollingUpdateList
, rollingUpdateList
, rulNextPageToken
, rulKind
, rulItems
, rulSelfLink
, OperationWarningsItem
, operationWarningsItem
, owiData
, owiCode
, owiMessage
) where
import Network.Google.Prelude
import Network.Google.ReplicaPoolUpdater.Types
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Cancel
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Get
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Insert
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.List
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.ListInstanceUpdates
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Pause
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Resume
import Network.Google.Resource.ReplicaPoolUpdater.RollingUpdates.Rollback
import Network.Google.Resource.ReplicaPoolUpdater.ZoneOperations.Get
import Network.Google.Resource.ReplicaPoolUpdater.ZoneOperations.List
type ReplicaPoolUpdaterAPI =
RollingUpdatesInsertResource :<|>
RollingUpdatesListResource
:<|> RollingUpdatesGetResource
:<|> RollingUpdatesRollbackResource
:<|> RollingUpdatesPauseResource
:<|> RollingUpdatesCancelResource
:<|> RollingUpdatesListInstanceUpdatesResource
:<|> RollingUpdatesResumeResource
:<|> ZoneOperationsListResource
:<|> ZoneOperationsGetResource