{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Tracing.Types
(
tracingService
, traceAppendScope
, traceReadOnlyScope
, cloudPlatformScope
, Span
, span
, sStatus
, sStartTime
, sName
, sStackTrace
, sAttributes
, sEndTime
, sTimeEvents
, sDisplayName
, sParentSpanId
, sLinks
, sSpanId
, TruncatableString
, truncatableString
, tsTruncatedCharacterCount
, tsValue
, Status
, status
, sDetails
, sCode
, sMessage
, AttributesAttributeMap
, attributesAttributeMap
, aamAddtional
, Annotation
, annotation
, aAttributes
, aDescription
, AttributeValue
, attributeValue
, avBoolValue
, avIntValue
, avStringValue
, NetworkEventType (..)
, Empty
, empty
, Link
, link
, lTraceId
, lType
, lSpanId
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, ListSpansResponse
, listSpansResponse
, lsrNextPageToken
, lsrSpans
, StackTrace
, stackTrace
, stStackTraceHashId
, stStackFrames
, BatchWriteSpansRequest
, batchWriteSpansRequest
, bwsrSpans
, Attributes
, attributes
, aDroppedAttributesCount
, aAttributeMap
, NetworkEvent
, networkEvent
, neTime
, neMessageSize
, neType
, neMessageId
, Module
, module'
, mBuildId
, mModule
, TimeEvents
, timeEvents
, teDroppedAnnotationsCount
, teDroppedNetworkEventsCount
, teTimeEvent
, Xgafv (..)
, StackFrames
, stackFrames
, sfDroppedFramesCount
, sfFrame
, LinkType (..)
, StackFrame
, stackFrame
, sfLoadModule
, sfOriginalFunctionName
, sfLineNumber
, sfSourceVersion
, sfFunctionName
, sfColumnNumber
, sfFileName
, Links
, links
, lDroppedLinksCount
, lLink
, ListTracesResponse
, listTracesResponse
, ltrNextPageToken
, ltrTraces
, TimeEvent
, timeEvent
, teAnnotation
, teTime
, teNetworkEvent
, Trace
, trace
, tName
) where
import Network.Google.Prelude
import Network.Google.Tracing.Types.Product
import Network.Google.Tracing.Types.Sum
tracingService :: ServiceConfig
tracingService
= defaultService (ServiceId "tracing:v2")
"tracing.googleapis.com"
traceAppendScope :: Proxy '["https://www.googleapis.com/auth/trace.append"]
traceAppendScope = Proxy;
traceReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/trace.readonly"]
traceReadOnlyScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;