{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.CloudTrace.Types
(
cloudTraceService
, traceAppendScope
, cloudPlatformScope
, Span
, span
, sStatus
, sStartTime
, sChildSpanCount
, sSameProcessAsParentSpan
, sName
, sStackTrace
, sAttributes
, sEndTime
, sTimeEvents
, sDisplayName
, sParentSpanId
, sLinks
, sSpanId
, TruncatableString
, truncatableString
, tsValue
, tsTruncatedByteCount
, Status
, status
, sDetails
, sCode
, sMessage
, AttributesAttributeMap
, attributesAttributeMap
, aamAddtional
, Annotation
, annotation
, aAttributes
, aDescription
, AttributeValue
, attributeValue
, avBoolValue
, avIntValue
, avStringValue
, MessageEvent
, messageEvent
, meId
, meUncompressedSizeBytes
, meType
, meCompressedSizeBytes
, Empty
, empty
, Link
, link
, lTraceId
, lAttributes
, lType
, lSpanId
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, StackTrace
, stackTrace
, stStackTraceHashId
, stStackFrames
, BatchWriteSpansRequest
, batchWriteSpansRequest
, bwsrSpans
, MessageEventType (..)
, Attributes
, attributes
, aDroppedAttributesCount
, aAttributeMap
, Module
, module'
, mBuildId
, mModule
, TimeEvents
, timeEvents
, teDroppedMessageEventsCount
, teDroppedAnnotationsCount
, teTimeEvent
, Xgafv (..)
, StackFrames
, stackFrames
, sfDroppedFramesCount
, sfFrame
, LinkType (..)
, StackFrame
, stackFrame
, sfLoadModule
, sfOriginalFunctionName
, sfLineNumber
, sfSourceVersion
, sfFunctionName
, sfColumnNumber
, sfFileName
, Links
, links
, lDroppedLinksCount
, lLink
, TimeEvent
, timeEvent
, teMessageEvent
, teAnnotation
, teTime
) where
import Network.Google.CloudTrace.Types.Product
import Network.Google.CloudTrace.Types.Sum
import Network.Google.Prelude
cloudTraceService :: ServiceConfig
cloudTraceService
= defaultService (ServiceId "cloudtrace:v2")
"cloudtrace.googleapis.com"
traceAppendScope :: Proxy '["https://www.googleapis.com/auth/trace.append"]
traceAppendScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;