{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Logging.Types
(
loggingService
, loggingAdminScope
, loggingReadScope
, loggingWriteScope
, cloudPlatformReadOnlyScope
, cloudPlatformScope
, MetricDescriptorValueType (..)
, MonitoredResourceDescriptor
, monitoredResourceDescriptor
, mrdName
, mrdDisplayName
, mrdLabels
, mrdType
, mrdDescription
, ListLogEntriesResponse
, listLogEntriesResponse
, llerNextPageToken
, llerEntries
, MetricDescriptor
, metricDescriptor
, mdMetricKind
, mdName
, mdMetadata
, mdDisplayName
, mdLabels
, mdType
, mdValueType
, mdDescription
, mdUnit
, MonitoredResourceLabels
, monitoredResourceLabels
, mrlAddtional
, LogMetricVersion (..)
, MonitoredResourceMetadata
, monitoredResourceMetadata
, mrmUserLabels
, mrmSystemLabels
, ListLogMetricsResponse
, listLogMetricsResponse
, llmrMetrics
, llmrNextPageToken
, WriteLogEntriesRequest
, writeLogEntriesRequest
, wlerEntries
, wlerPartialSuccess
, wlerResource
, wlerLabels
, wlerLogName
, wlerDryRun
, LogMetricLabelExtractors
, logMetricLabelExtractors
, lmleAddtional
, LogSinkOutputVersionFormat (..)
, Empty
, empty
, LogEntryLabels
, logEntryLabels
, lelAddtional
, ListSinksResponse
, listSinksResponse
, lsrSinks
, lsrNextPageToken
, RequestLog
, requestLog
, rlTraceId
, rlInstanceId
, rlStatus
, rlRequestId
, rlInstanceIndex
, rlModuleId
, rlVersionId
, rlHTTPVersion
, rlTaskName
, rlPendingTime
, rlWasLoadingRequest
, rlFirst
, rlStartTime
, rlLatency
, rlURLMapEntry
, rlCost
, rlReferrer
, rlLine
, rlIP
, rlAppId
, rlMethod
, rlResource
, rlEndTime
, rlFinished
, rlMegaCycles
, rlUserAgent
, rlNickname
, rlHost
, rlTraceSampled
, rlTaskQueueName
, rlResponseSize
, rlSourceReference
, rlAppEngineRelease
, LogEntryProtoPayload
, logEntryProtoPayload
, leppAddtional
, LogEntrySourceLocation
, logEntrySourceLocation
, leslFunction
, leslLine
, leslFile
, LogExclusion
, logExclusion
, leDisabled
, leName
, leFilter
, leDescription
, WriteLogEntriesResponse
, writeLogEntriesResponse
, MetricDescriptorMetadataLaunchStage (..)
, LogSink
, logSink
, lsDestination
, lsIncludeChildren
, lsOutputVersionFormat
, lsWriterIdentity
, lsName
, lsFilter
, MonitoredResourceMetadataUserLabels
, monitoredResourceMetadataUserLabels
, mrmulAddtional
, ListExclusionsResponse
, listExclusionsResponse
, lerNextPageToken
, lerExclusions
, ListLogsResponse
, listLogsResponse
, llrNextPageToken
, llrLogNames
, ListMonitoredResourceDescriptorsResponse
, listMonitoredResourceDescriptorsResponse
, lmrdrNextPageToken
, lmrdrResourceDescriptors
, LabelDescriptorValueType (..)
, Explicit
, explicit
, eBounds
, HTTPRequest
, hTTPRequest
, httprStatus
, httprRequestURL
, httprCacheFillBytes
, httprRemoteIP
, httprLatency
, httprProtocol
, httprServerIP
, httprRequestSize
, httprCacheValidatedWithOriginServer
, httprUserAgent
, httprCacheLookup
, httprResponseSize
, httprRequestMethod
, httprCacheHit
, httprReferer
, Exponential
, exponential
, eGrowthFactor
, eScale
, eNumFiniteBuckets
, WriteLogEntriesRequestLabels
, writeLogEntriesRequestLabels
, wlerlAddtional
, MonitoredResource
, monitoredResource
, mrLabels
, mrType
, Xgafv (..)
, LogLine
, logLine
, llTime
, llSeverity
, llLogMessage
, llSourceLocation
, MetricDescriptorMetadata
, metricDescriptorMetadata
, mdmSamplePeriod
, mdmIngestDelay
, mdmLaunchStage
, MonitoredResourceMetadataSystemLabels
, monitoredResourceMetadataSystemLabels
, mrmslAddtional
, LabelDescriptor
, labelDescriptor
, ldKey
, ldValueType
, ldDescription
, Linear
, linear
, lOffSet
, lWidth
, lNumFiniteBuckets
, ListLogEntriesRequest
, listLogEntriesRequest
, llerOrderBy
, llerProjectIds
, llerFilter
, llerPageToken
, llerPageSize
, llerResourceNames
, LogEntryOperation
, logEntryOperation
, leoFirst
, leoProducer
, leoLast
, leoId
, LogMetric
, logMetric
, lmMetricDescriptor
, lmName
, lmVersion
, lmLabelExtractors
, lmFilter
, lmValueExtractor
, lmBucketOptions
, lmDescription
, LogEntry
, logEntry
, leOperation
, leSeverity
, leTextPayload
, leJSONPayload
, leHTTPRequest
, leResource
, leInsertId
, leMetadata
, leReceiveTimestamp
, leLabels
, leProtoPayload
, leSourceLocation
, leTraceSampled
, leLogName
, leTimestamp
, leTrace
, leSpanId
, SourceLocation
, sourceLocation
, slLine
, slFunctionName
, slFile
, MetricDescriptorMetricKind (..)
, LogEntrySeverity (..)
, BucketOptions
, bucketOptions
, boExponentialBuckets
, boLinearBuckets
, boExplicitBuckets
, SourceReference
, sourceReference
, srRepository
, srRevisionId
, LogEntryJSONPayload
, logEntryJSONPayload
, lejpAddtional
, LogLineSeverity (..)
) where
import Network.Google.Logging.Types.Product
import Network.Google.Logging.Types.Sum
import Network.Google.Prelude
loggingService :: ServiceConfig
loggingService
= defaultService (ServiceId "logging:v2")
"logging.googleapis.com"
loggingAdminScope :: Proxy '["https://www.googleapis.com/auth/logging.admin"]
loggingAdminScope = Proxy;
loggingReadScope :: Proxy '["https://www.googleapis.com/auth/logging.read"]
loggingReadScope = Proxy;
loggingWriteScope :: Proxy '["https://www.googleapis.com/auth/logging.write"]
loggingWriteScope = Proxy;
cloudPlatformReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform.read-only"]
cloudPlatformReadOnlyScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;