{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.CloudTrace
(
cloudTraceService
, traceAppendScope
, cloudPlatformScope
, CloudTraceAPI
, module Network.Google.Resource.CloudTrace.Projects.Traces.BatchWrite
, module Network.Google.Resource.CloudTrace.Projects.Traces.Spans.CreateSpan
, 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
import Network.Google.Prelude
import Network.Google.Resource.CloudTrace.Projects.Traces.BatchWrite
import Network.Google.Resource.CloudTrace.Projects.Traces.Spans.CreateSpan
type CloudTraceAPI =
ProjectsTracesSpansCreateSpanResource :<|>
ProjectsTracesBatchWriteResource