{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Genomics.Types
(
genomicsService
, genomicsScope
, cloudPlatformScope
, ContainerStartedEventPortMAppings
, containerStartedEventPortMAppings
, csepmaAddtional
, Event
, event
, eDetails
, eTimestamp
, eDescription
, CheckInRequestEvent
, checkInRequestEvent
, cireAddtional
, Status
, status
, sDetails
, sCode
, sMessage
, OperationSchema
, operationSchema
, osAddtional
, RunPipelineRequestLabels
, runPipelineRequestLabels
, rprlAddtional
, ListOperationsResponse
, listOperationsResponse
, lorNextPageToken
, lorOperations
, FailedEvent
, failedEvent
, feCause
, feCode
, CancelOperationRequest
, cancelOperationRequest
, WorkerStatus
, workerStatus
, wsTotalRamBytes
, wsAttachedDisks
, wsUptimeSeconds
, wsBootDisk
, wsFreeRamBytes
, ContainerStoppedEvent
, containerStoppedEvent
, cseExitStatus
, cseActionId
, cseStderr
, CheckInResponse
, checkInResponse
, cirDeadline
, cirMetadata
, WorkerAssignedEvent
, workerAssignedEvent
, waeZone
, waeInstance
, OperationMetadataLabels
, operationMetadataLabels
, omlAddtional
, Operation
, operation
, oDone
, oError
, oResponse
, oName
, oMetadata
, Empty
, empty
, Disk
, disk
, dSourceImage
, dSizeGb
, dName
, dType
, UnexpectedExitStatusEvent
, unexpectedExitStatusEvent
, ueseExitStatus
, ueseActionId
, DelayedEvent
, delayedEvent
, deMetrics
, deCause
, ActionPortMAppings
, actionPortMAppings
, apmaAddtional
, MetadataLabels
, metadataLabels
, mlAddtional
, CheckInRequest
, checkInRequest
, cirEvent
, cirWorkerStatus
, cirResult
, cirDeadlineExpired
, ContainerKilledEvent
, containerKilledEvent
, ckeActionId
, PullStoppedEvent
, pullStoppedEvent
, pseImageURI
, ActionLabels
, actionLabels
, alAddtional
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, Network
, network
, nUsePrivateAddress
, nName
, nSubnetwork
, EventDetails
, eventDetails
, edAddtional
, Action
, action
, aCommands
, aFlags
, aEnvironment
, aCredentials
, aEntrypoint
, aPortMAppings
, aMounts
, aImageURI
, aName
, aLabels
, aTimeout
, aPidNamespace
, Secret
, secret
, sKeyName
, sCipherText
, WorkerStatusAttachedDisks
, workerStatusAttachedDisks
, wsadAddtional
, OperationMetadataRequest
, operationMetadataRequest
, omrAddtional
, Resources
, resources
, rZones
, rRegions
, rVirtualMachine
, rProjectId
, DiskStatus
, diskStatus
, dsTotalSpaceBytes
, dsFreeSpaceBytes
, VirtualMachineLabels
, virtualMachineLabels
, vmlAddtional
, OperationMetadataRuntimeMetadata
, operationMetadataRuntimeMetadata
, omrmAddtional
, VirtualMachine
, virtualMachine
, vmNetwork
, vmCPUPlatform
, vmServiceAccount
, vmAccelerators
, vmMachineType
, vmLabels
, vmBootDiskSizeGb
, vmDisks
, vmBootImage
, vmNvidiaDriverVersion
, vmPreemptible
, ServiceAccount
, serviceAccount
, saEmail
, saScopes
, CheckInResponseMetadata
, checkInResponseMetadata
, cirmAddtional
, Accelerator
, accelerator
, aCount
, aType
, PipelineEnvironment
, pipelineEnvironment
, peAddtional
, WorkerReleasedEvent
, workerReleasedEvent
, wreZone
, wreInstance
, ContainerStartedEvent
, containerStartedEvent
, cIPAddress
, cActionId
, cPortMAppings
, FailedEventCode (..)
, Xgafv (..)
, RunPipelineRequest
, runPipelineRequest
, rprPipeline
, rprLabels
, Pipeline
, pipeline
, pActions
, pEnvironment
, pResources
, pTimeout
, ImportVariantsResponse
, importVariantsResponse
, ivrCallSetIds
, ImportReadGroupSetsResponse
, importReadGroupSetsResponse
, irgsrReadGroupSetIds
, Metadata
, metadata
, mStartTime
, mEvents
, mEndTime
, mPipeline
, mLabels
, mCreateTime
, Mount
, mount
, mPath
, mDisk
, mReadOnly
, PullStartedEvent
, pullStartedEvent
, pImageURI
, RunPipelineResponse
, runPipelineResponse
, OperationMetadata
, operationMetadata
, omClientId
, omStartTime
, omEvents
, omEndTime
, omLabels
, omProjectId
, omCreateTime
, omRuntimeMetadata
, omRequest
, ActionEnvironment
, actionEnvironment
, aeAddtional
, ComputeEngine
, computeEngine
, ceZone
, ceDiskNames
, ceMachineType
, ceInstanceName
, OperationResponse
, operationResponse
, orAddtional
, OperationEvent
, operationEvent
, oeStartTime
, oeEndTime
, oeDescription
, RuntimeMetadata
, runtimeMetadata
, rmComputeEngine
) where
import Network.Google.Genomics.Types.Product
import Network.Google.Genomics.Types.Sum
import Network.Google.Prelude
genomicsService :: ServiceConfig
genomicsService
= defaultService (ServiceId "genomics:v2alpha1")
"genomics.googleapis.com"
genomicsScope :: Proxy '["https://www.googleapis.com/auth/genomics"]
genomicsScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;