{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.TPU.Types
(
tPUService
, cloudPlatformScope
, Status
, status
, sDetails
, sCode
, sMessage
, OperationSchema
, operationSchema
, osAddtional
, ListLocationsResponse
, listLocationsResponse
, llrNextPageToken
, llrLocations
, AcceleratorType
, acceleratorType
, atName
, atType
, ListOperationsResponse
, listOperationsResponse
, lorNextPageToken
, lorOperations
, NodeState (..)
, ListAcceleratorTypesResponse
, listAcceleratorTypesResponse
, latrAcceleratorTypes
, latrNextPageToken
, Location
, location
, lName
, lMetadata
, lDisplayName
, lLabels
, lLocationId
, Operation
, operation
, oDone
, oError
, oResponse
, oName
, oMetadata
, NetworkEndpoint
, networkEndpoint
, neIPAddress
, nePort
, Empty
, empty
, Node
, node
, nAcceleratorType
, nIPAddress
, nState
, nNetwork
, nHealth
, nServiceAccount
, nName
, nSchedulingConfig
, nHealthDescription
, nCIdRBlock
, nLabels
, nNetworkEndpoints
, nDescription
, nCreateTime
, nTensorflowVersion
, nPort
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, StopNodeRequest
, stopNodeRequest
, ReimageNodeRequest
, reimageNodeRequest
, rnrTensorflowVersion
, NodeHealth (..)
, ListNodesResponse
, listNodesResponse
, lnrNextPageToken
, lnrUnreachable
, lnrNodes
, Xgafv (..)
, SchedulingConfig
, schedulingConfig
, scPreemptible
, NodeLabels
, nodeLabels
, nlAddtional
, LocationLabels
, locationLabels
, llAddtional
, LocationMetadata
, locationMetadata
, lmAddtional
, OperationMetadata
, operationMetadata
, omAPIVersion
, omEndTime
, omStatusDetail
, omVerb
, omCancelRequested
, omTarget
, omCreateTime
, ListTensorFlowVersionsResponse
, listTensorFlowVersionsResponse
, ltfvrNextPageToken
, ltfvrTensorflowVersions
, OperationResponse
, operationResponse
, orAddtional
, TensorFlowVersion
, tensorFlowVersion
, tfvName
, tfvVersion
, StartNodeRequest
, startNodeRequest
) where
import Network.Google.Prelude
import Network.Google.TPU.Types.Product
import Network.Google.TPU.Types.Sum
tPUService :: ServiceConfig
tPUService
= defaultService (ServiceId "tpu:v1")
"tpu.googleapis.com"
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;