{-# LANGUAGE DataKinds #-} {-# LANGUAGE DeriveGeneric #-} {-# LANGUAGE DerivingStrategies #-} {-# LANGUAGE ExistentialQuantification #-} {-# LANGUAGE RankNTypes #-} {-# LANGUAGE StrictData #-} module OpenTelemetry.Internal.Trace.Types where import Control.Concurrent.Async (Async) import Control.Exception (SomeException) import Control.Monad.IO.Class import Data.Bits import Data.HashMap.Strict (HashMap) import Data.Hashable (Hashable) import Data.IORef (IORef, readIORef) import Data.String (IsString (..)) import Data.Text (Text) import Data.Vector (Vector) import Data.Word (Word8) import GHC.Generics import Network.HTTP.Types (RequestHeaders, ResponseHeaders) import OpenTelemetry.Attributes import OpenTelemetry.Common import OpenTelemetry.Context.Types import OpenTelemetry.Logging.Core (Log) import OpenTelemetry.Propagator (Propagator) import OpenTelemetry.Resource import OpenTelemetry.Trace.Id import OpenTelemetry.Trace.Id.Generator import OpenTelemetry.Trace.TraceState import OpenTelemetry.Util data ExportResult = Success | Failure (Maybe SomeException) {- | An identifier for the library that provides the instrumentation for a given Instrumented Library. Instrumented Library and Instrumentation Library may be the same library if it has built-in OpenTelemetry instrumentation. The inspiration of the OpenTelemetry project is to make every library and application observable out of the box by having them call OpenTelemetry API directly. However, many libraries will not have such integration, and as such there is a need for a separate library which would inject such calls, using mechanisms such as wrapping interfaces, subscribing to library-specific callbacks, or translating existing telemetry into the OpenTelemetry model. A library that enables OpenTelemetry observability for another library is called an Instrumentation Library. An instrumentation library should be named to follow any naming conventions of the instrumented library (e.g. 'middleware' for a web framework). If there is no established name, the recommendation is to prefix packages with "hs-opentelemetry-instrumentation", followed by the instrumented library name itself. In general, you can initialize the instrumentation library like so: @ import qualified Data.Text as T import Data.Version (showVersion) import Paths_your_package_name instrumentationLibrary :: InstrumentationLibrary instrumentationLibrary = InstrumentationLibrary { libraryName = "your_package_name" , libraryVersion = T.pack $ showVersion version } @ -} data InstrumentationLibrary = InstrumentationLibrary { InstrumentationLibrary -> Text libraryName :: {-# UNPACK #-} !Text -- ^ The name of the instrumentation library , InstrumentationLibrary -> Text libraryVersion :: {-# UNPACK #-} !Text -- ^ The version of the instrumented library } deriving (Eq InstrumentationLibrary InstrumentationLibrary -> InstrumentationLibrary -> Bool InstrumentationLibrary -> InstrumentationLibrary -> Ordering InstrumentationLibrary -> InstrumentationLibrary -> InstrumentationLibrary forall a. Eq a -> (a -> a -> Ordering) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> Bool) -> (a -> a -> a) -> (a -> a -> a) -> Ord a min :: InstrumentationLibrary -> InstrumentationLibrary -> InstrumentationLibrary $cmin :: InstrumentationLibrary -> InstrumentationLibrary -> InstrumentationLibrary max :: InstrumentationLibrary -> InstrumentationLibrary -> InstrumentationLibrary $cmax :: InstrumentationLibrary -> InstrumentationLibrary -> InstrumentationLibrary >= :: InstrumentationLibrary -> InstrumentationLibrary -> Bool $c>= :: InstrumentationLibrary -> InstrumentationLibrary -> Bool > :: InstrumentationLibrary -> InstrumentationLibrary -> Bool $c> :: InstrumentationLibrary -> InstrumentationLibrary -> Bool <= :: InstrumentationLibrary -> InstrumentationLibrary -> Bool $c<= :: InstrumentationLibrary -> InstrumentationLibrary -> Bool < :: InstrumentationLibrary -> InstrumentationLibrary -> Bool $c< :: InstrumentationLibrary -> InstrumentationLibrary -> Bool compare :: InstrumentationLibrary -> InstrumentationLibrary -> Ordering $ccompare :: InstrumentationLibrary -> InstrumentationLibrary -> Ordering Ord, InstrumentationLibrary -> InstrumentationLibrary -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: InstrumentationLibrary -> InstrumentationLibrary -> Bool $c/= :: InstrumentationLibrary -> InstrumentationLibrary -> Bool == :: InstrumentationLibrary -> InstrumentationLibrary -> Bool $c== :: InstrumentationLibrary -> InstrumentationLibrary -> Bool Eq, forall x. Rep InstrumentationLibrary x -> InstrumentationLibrary forall x. InstrumentationLibrary -> Rep InstrumentationLibrary x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep InstrumentationLibrary x -> InstrumentationLibrary $cfrom :: forall x. InstrumentationLibrary -> Rep InstrumentationLibrary x Generic, Int -> InstrumentationLibrary -> ShowS [InstrumentationLibrary] -> ShowS InstrumentationLibrary -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [InstrumentationLibrary] -> ShowS $cshowList :: [InstrumentationLibrary] -> ShowS show :: InstrumentationLibrary -> String $cshow :: InstrumentationLibrary -> String showsPrec :: Int -> InstrumentationLibrary -> ShowS $cshowsPrec :: Int -> InstrumentationLibrary -> ShowS Show) instance Hashable InstrumentationLibrary instance IsString InstrumentationLibrary where fromString :: String -> InstrumentationLibrary fromString String str = Text -> Text -> InstrumentationLibrary InstrumentationLibrary (forall a. IsString a => String -> a fromString String str) Text "" data Exporter a = Exporter { forall a. Exporter a -> HashMap InstrumentationLibrary (Vector a) -> IO ExportResult exporterExport :: HashMap InstrumentationLibrary (Vector a) -> IO ExportResult , forall a. Exporter a -> IO () exporterShutdown :: IO () } data ShutdownResult = ShutdownSuccess | ShutdownFailure | ShutdownTimeout data Processor = Processor { Processor -> IORef ImmutableSpan -> Context -> IO () processorOnStart :: IORef ImmutableSpan -> Context -> IO () -- ^ Called when a span is started. This method is called synchronously on the thread that started the span, therefore it should not block or throw exceptions. , Processor -> IORef ImmutableSpan -> IO () processorOnEnd :: IORef ImmutableSpan -> IO () -- ^ Called after a span is ended (i.e., the end timestamp is already set). This method is called synchronously within the 'OpenTelemetry.Trace.endSpan' API, therefore it should not block or throw an exception. , Processor -> IO (Async ShutdownResult) processorShutdown :: IO (Async ShutdownResult) -- ^ Shuts down the processor. Called when SDK is shut down. This is an opportunity for processor to do any cleanup required. -- -- Shutdown SHOULD be called only once for each SpanProcessor instance. After the call to Shutdown, subsequent calls to OnStart, OnEnd, or ForceFlush are not allowed. SDKs SHOULD ignore these calls gracefully, if possible. -- -- Shutdown SHOULD let the caller know whether it succeeded, failed or timed out. -- -- Shutdown MUST include the effects of ForceFlush. -- -- Shutdown SHOULD complete or abort within some timeout. Shutdown can be implemented as a blocking API or an asynchronous API which notifies the caller via a callback or an event. OpenTelemetry client authors can decide if they want to make the shutdown timeout configurable. , Processor -> IO () processorForceFlush :: IO () -- ^ This is a hint to ensure that any tasks associated with Spans for which the SpanProcessor had already received events prior to the call to ForceFlush SHOULD be completed as soon as possible, preferably before returning from this method. -- -- In particular, if any Processor has any associated exporter, it SHOULD try to call the exporter's Export with all spans for which this was not already done and then invoke ForceFlush on it. The built-in SpanProcessors MUST do so. If a timeout is specified (see below), the SpanProcessor MUST prioritize honoring the timeout over finishing all calls. It MAY skip or abort some or all Export or ForceFlush calls it has made to achieve this goal. -- -- ForceFlush SHOULD provide a way to let the caller know whether it succeeded, failed or timed out. -- -- ForceFlush SHOULD only be called in cases where it is absolutely necessary, such as when using some FaaS providers that may suspend the process after an invocation, but before the SpanProcessor exports the completed spans. -- -- ForceFlush SHOULD complete or abort within some timeout. ForceFlush can be implemented as a blocking API or an asynchronous API which notifies the caller via a callback or an event. OpenTelemetry client authors can decide if they want to make the flush timeout configurable. } {- | 'Tracer's can be created from a 'TracerProvider'. -} data TracerProvider = TracerProvider { TracerProvider -> Vector Processor tracerProviderProcessors :: !(Vector Processor) , TracerProvider -> IdGenerator tracerProviderIdGenerator :: !IdGenerator , TracerProvider -> Sampler tracerProviderSampler :: !Sampler , TracerProvider -> MaterializedResources tracerProviderResources :: !MaterializedResources , TracerProvider -> AttributeLimits tracerProviderAttributeLimits :: !AttributeLimits , TracerProvider -> SpanLimits tracerProviderSpanLimits :: !SpanLimits , TracerProvider -> Propagator Context RequestHeaders RequestHeaders tracerProviderPropagators :: !(Propagator Context RequestHeaders ResponseHeaders) , TracerProvider -> Log Text -> IO () tracerProviderLogger :: Log Text -> IO () } {- | The 'Tracer' is responsible for creating 'Span's. Each 'Tracer' should be associated with the library or application that it instruments. -} data Tracer = Tracer { Tracer -> InstrumentationLibrary tracerName :: {-# UNPACK #-} !InstrumentationLibrary -- ^ Get the name of the 'Tracer' -- -- @since 0.0.10 , Tracer -> TracerProvider tracerProvider :: !TracerProvider -- ^ Get the TracerProvider from which the 'Tracer' was created -- -- @since 0.0.10 } instance Show Tracer where showsPrec :: Int -> Tracer -> ShowS showsPrec Int d Tracer {tracerName :: Tracer -> InstrumentationLibrary tracerName = InstrumentationLibrary name} = Bool -> ShowS -> ShowS showParen (Int d forall a. Ord a => a -> a -> Bool > Int 10) forall a b. (a -> b) -> a -> b $ String -> ShowS showString String "Tracer {tracerName = " forall b c a. (b -> c) -> (a -> b) -> a -> c . forall a. Show a => a -> ShowS shows InstrumentationLibrary name forall b c a. (b -> c) -> (a -> b) -> a -> c . String -> ShowS showString String "}" {- | This is a link that is being added to a span which is going to be created. A @Span@ may be linked to zero or more other @Spans@ (defined by @SpanContext@) that are causally related. @Link@s can point to Spans inside a single Trace or across different Traces. @Link@s can be used to represent batched operations where a @Span@ was initiated by multiple initiating Spans, each representing a single incoming item being processed in the batch. Another example of using a Link is to declare the relationship between the originating and following trace. This can be used when a Trace enters trusted boundaries of a service and service policy requires the generation of a new Trace rather than trusting the incoming Trace context. The new linked Trace may also represent a long running asynchronous data processing operation that was initiated by one of many fast incoming requests. When using the scatter\/gather (also called fork\/join) pattern, the root operation starts multiple downstream processing operations and all of them are aggregated back in a single Span. This last Span is linked to many operations it aggregates. All of them are the Spans from the same Trace. And similar to the Parent field of a Span. It is recommended, however, to not set parent of the Span in this scenario as semantically the parent field represents a single parent scenario, in many cases the parent Span fully encloses the child Span. This is not the case in scatter/gather and batch scenarios. -} data NewLink = NewLink { NewLink -> SpanContext linkContext :: !SpanContext -- ^ @SpanContext@ of the @Span@ to link to. , NewLink -> [(Text, Attribute)] linkAttributes :: [(Text, Attribute)] -- ^ Zero or more Attributes further describing the link. } deriving (Int -> NewLink -> ShowS [NewLink] -> ShowS NewLink -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [NewLink] -> ShowS $cshowList :: [NewLink] -> ShowS show :: NewLink -> String $cshow :: NewLink -> String showsPrec :: Int -> NewLink -> ShowS $cshowsPrec :: Int -> NewLink -> ShowS Show) {- | This is an immutable link for an existing span. A @Span@ may be linked to zero or more other @Spans@ (defined by @SpanContext@) that are causally related. @Link@s can point to Spans inside a single Trace or across different Traces. @Link@s can be used to represent batched operations where a @Span@ was initiated by multiple initiating Spans, each representing a single incoming item being processed in the batch. Another example of using a Link is to declare the relationship between the originating and following trace. This can be used when a Trace enters trusted boundaries of a service and service policy requires the generation of a new Trace rather than trusting the incoming Trace context. The new linked Trace may also represent a long running asynchronous data processing operation that was initiated by one of many fast incoming requests. When using the scatter/gather (also called fork/join) pattern, the root operation starts multiple downstream processing operations and all of them are aggregated back in a single Span. This last Span is linked to many operations it aggregates. All of them are the Spans from the same Trace. And similar to the Parent field of a Span. It is recommended, however, to not set parent of the Span in this scenario as semantically the parent field represents a single parent scenario, in many cases the parent Span fully encloses the child Span. This is not the case in scatter/gather and batch scenarios. -} data Link = Link { Link -> SpanContext frozenLinkContext :: !SpanContext -- ^ @SpanContext@ of the @Span@ to link to. , Link -> Attributes frozenLinkAttributes :: Attributes -- ^ Zero or more Attributes further describing the link. } deriving (Int -> Link -> ShowS [Link] -> ShowS Link -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Link] -> ShowS $cshowList :: [Link] -> ShowS show :: Link -> String $cshow :: Link -> String showsPrec :: Int -> Link -> ShowS $cshowsPrec :: Int -> Link -> ShowS Show) -- | Non-name fields that may be set on initial creation of a 'Span'. data SpanArguments = SpanArguments { SpanArguments -> SpanKind kind :: SpanKind -- ^ The kind of the span. See 'SpanKind's documentation for the semantics -- of the various values that may be specified. , SpanArguments -> [(Text, Attribute)] attributes :: [(Text, Attribute)] -- ^ An initial set of attributes that may be set on initial 'Span' creation. -- These attributes are provided to 'Processor's, so they may be useful in some -- scenarios where calling `addAttribute` or `addAttributes` is too late. , SpanArguments -> [NewLink] links :: [NewLink] -- ^ A collection of `Link`s that point to causally related 'Span's. , SpanArguments -> Maybe Timestamp startTime :: Maybe Timestamp -- ^ An explicit start time, if the span has already begun. } -- | The outcome of a call to 'OpenTelemetry.Trace.forceFlush' data FlushResult = -- | One or more spans did not export from all associated exporters -- within the alotted timeframe. FlushTimeout | -- | Flushing spans to all associated exporters succeeded. FlushSuccess | -- | One or more exporters failed to successfully export one or more -- unexported spans. FlushError deriving (Int -> FlushResult -> ShowS [FlushResult] -> ShowS FlushResult -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [FlushResult] -> ShowS $cshowList :: [FlushResult] -> ShowS show :: FlushResult -> String $cshow :: FlushResult -> String showsPrec :: Int -> FlushResult -> ShowS $cshowsPrec :: Int -> FlushResult -> ShowS Show) {- | @SpanKind@ describes the relationship between the @Span@, its parents, and its children in a Trace. @SpanKind@ describes two independent properties that benefit tracing systems during analysis. The first property described by @SpanKind@ reflects whether the @Span@ is a remote child or parent. @Span@s with a remote parent are interesting because they are sources of external load. Spans with a remote child are interesting because they reflect a non-local system dependency. The second property described by @SpanKind@ reflects whether a child @Span@ represents a synchronous call. When a child span is synchronous, the parent is expected to wait for it to complete under ordinary circumstances. It can be useful for tracing systems to know this property, since synchronous @Span@s may contribute to the overall trace latency. Asynchronous scenarios can be remote or local. In order for @SpanKind@ to be meaningful, callers SHOULD arrange that a single @Span@ does not serve more than one purpose. For example, a server-side span SHOULD NOT be used directly as the parent of another remote span. As a simple guideline, instrumentation should create a new @Span@ prior to extracting and serializing the @SpanContext@ for a remote call. To summarize the interpretation of these kinds +-------------+--------------+---------------+------------------+------------------+ | `SpanKind` | Synchronous | Asynchronous | Remote Incoming | Remote Outgoing | +=============+==============+===============+==================+==================+ | `Client` | yes | | | yes | +-------------+--------------+---------------+------------------+------------------+ | `Server` | yes | | yes | | +-------------+--------------+---------------+------------------+------------------+ | `Producer` | | yes | | maybe | +-------------+--------------+---------------+------------------+------------------+ | `Consumer` | | yes | maybe | | +-------------+--------------+---------------+------------------+------------------+ | `Internal` | | | | | +-------------+--------------+---------------+------------------+------------------+ -} data SpanKind = -- | Indicates that the span covers server-side handling of a synchronous RPC or other remote request. -- This span is the child of a remote @Client@ span that was expected to wait for a response. Server | -- | Indicates that the span describes a synchronous request to some remote service. -- This span is the parent of a remote @Server@ span and waits for its response. Client | -- | Indicates that the span describes the parent of an asynchronous request. -- This parent span is expected to end before the corresponding child @Producer@ span, -- possibly even before the child span starts. In messaging scenarios with batching, -- tracing individual messages requires a new @Producer@ span per message to be created. Producer | -- | Indicates that the span describes the child of an asynchronous @Producer@ request. Consumer | -- | Default value. Indicates that the span represents an internal operation within an application, -- as opposed to an operations with remote parents or children. Internal deriving (Int -> SpanKind -> ShowS [SpanKind] -> ShowS SpanKind -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [SpanKind] -> ShowS $cshowList :: [SpanKind] -> ShowS show :: SpanKind -> String $cshow :: SpanKind -> String showsPrec :: Int -> SpanKind -> ShowS $cshowsPrec :: Int -> SpanKind -> ShowS Show) {- | The status of a @Span@. This may be used to indicate the successful completion of a span. The default is @Unset@ These values form a total order: Ok > Error > Unset. This means that setting Status with StatusCode=Ok will override any prior or future attempts to set span Status with StatusCode=Error or StatusCode=Unset. -} data SpanStatus = -- | The default status. Unset | -- | The operation contains an error. The text field may be empty, or else provide a description of the error. Error Text | -- | The operation has been validated by an Application developer or Operator to have completed successfully. Ok deriving (Int -> SpanStatus -> ShowS [SpanStatus] -> ShowS SpanStatus -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [SpanStatus] -> ShowS $cshowList :: [SpanStatus] -> ShowS show :: SpanStatus -> String $cshow :: SpanStatus -> String showsPrec :: Int -> SpanStatus -> ShowS $cshowsPrec :: Int -> SpanStatus -> ShowS Show, SpanStatus -> SpanStatus -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: SpanStatus -> SpanStatus -> Bool $c/= :: SpanStatus -> SpanStatus -> Bool == :: SpanStatus -> SpanStatus -> Bool $c== :: SpanStatus -> SpanStatus -> Bool Eq) instance Ord SpanStatus where compare :: SpanStatus -> SpanStatus -> Ordering compare SpanStatus Unset SpanStatus Unset = Ordering EQ compare SpanStatus Unset (Error Text _) = Ordering LT compare SpanStatus Unset SpanStatus Ok = Ordering LT compare (Error Text _) SpanStatus Unset = Ordering GT compare (Error Text _) (Error Text _) = Ordering GT -- This is a weird one, but last writer wins for errors compare (Error Text _) SpanStatus Ok = Ordering LT compare SpanStatus Ok SpanStatus Unset = Ordering GT compare SpanStatus Ok (Error Text _) = Ordering GT compare SpanStatus Ok SpanStatus Ok = Ordering EQ {- | The frozen representation of a 'Span' that originates from the currently running process. Only 'Processor's and 'Exporter's should use rely on this interface. -} data ImmutableSpan = ImmutableSpan { ImmutableSpan -> Text spanName :: Text -- ^ A name identifying the role of the span (like function or method name). , ImmutableSpan -> Maybe Span spanParent :: Maybe Span , ImmutableSpan -> SpanContext spanContext :: SpanContext -- ^ A `SpanContext` represents the portion of a `Span` which must be serialized and -- propagated along side of a distributed context. `SpanContext`s are immutable. , ImmutableSpan -> SpanKind spanKind :: SpanKind -- ^ The kind of the span. See 'SpanKind's documentation for the semantics -- of the various values that may be specified. , ImmutableSpan -> Timestamp spanStart :: Timestamp -- ^ A timestamp that corresponds to the start of the span , ImmutableSpan -> Maybe Timestamp spanEnd :: Maybe Timestamp -- ^ A timestamp that corresponds to the end of the span, if the span has ended. , ImmutableSpan -> Attributes spanAttributes :: Attributes , ImmutableSpan -> FrozenBoundedCollection Link spanLinks :: FrozenBoundedCollection Link -- ^ Zero or more links to related spans. Links can be useful for connecting causal relationships between things like web requests that enqueue asynchronous tasks to be processed. , ImmutableSpan -> AppendOnlyBoundedCollection Event spanEvents :: AppendOnlyBoundedCollection Event -- ^ Events, which denote a point in time occurrence. These can be useful for recording data about a span such as when an exception was thrown, or to emit structured logs into the span tree. , ImmutableSpan -> SpanStatus spanStatus :: SpanStatus , ImmutableSpan -> Tracer spanTracer :: Tracer -- ^ Creator of the span } deriving (Int -> ImmutableSpan -> ShowS [ImmutableSpan] -> ShowS ImmutableSpan -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [ImmutableSpan] -> ShowS $cshowList :: [ImmutableSpan] -> ShowS show :: ImmutableSpan -> String $cshow :: ImmutableSpan -> String showsPrec :: Int -> ImmutableSpan -> ShowS $cshowsPrec :: Int -> ImmutableSpan -> ShowS Show) {- | A 'Span' is the fundamental type you'll work with to trace your systems. A span is a single piece of instrumentation from a single location in your code or infrastructure. A span represents a single "unit of work" done by a service. Each span contains several key pieces of data: - A service name identifying the service the span is from - A name identifying the role of the span (like function or method name) - A timestamp that corresponds to the start of the span - A duration that describes how long that unit of work took to complete - An ID that uniquely identifies the span - A trace ID identifying which trace the span belongs to - A parent ID representing the parent span that called this span. (There is no parent ID for the root span of a given trace, which denotes that it's the start of the trace.) - Any additional metadata that might be helpful. - Zero or more links to related spans. Links can be useful for connecting causal relationships between things like web requests that enqueue asynchronous tasks to be processed. - Events, which denote a point in time occurrence. These can be useful for recording data about a span such as when an exception was thrown, or to emit structured logs into the span tree. A trace is made up of multiple spans. Tracing vendors such as Zipkin, Jaeger, Honeycomb, Datadog, Lightstep, etc. use the metadata from each span to reconstruct the relationships between them and generate a trace diagram. -} data Span = Span (IORef ImmutableSpan) | FrozenSpan SpanContext | Dropped SpanContext instance Show Span where showsPrec :: Int -> Span -> ShowS showsPrec Int d (Span IORef ImmutableSpan _ioref) = Bool -> ShowS -> ShowS showParen (Int d forall a. Ord a => a -> a -> Bool > Int 10) forall a b. (a -> b) -> a -> b $ String -> ShowS showString String "Span _ioref" showsPrec Int d (FrozenSpan SpanContext ctx) = Bool -> ShowS -> ShowS showParen (Int d forall a. Ord a => a -> a -> Bool > Int 10) forall a b. (a -> b) -> a -> b $ String -> ShowS showString String "FrozenSpan " forall b c a. (b -> c) -> (a -> b) -> a -> c . forall a. Show a => Int -> a -> ShowS showsPrec Int 11 SpanContext ctx showsPrec Int d (Dropped SpanContext ctx) = Bool -> ShowS -> ShowS showParen (Int d forall a. Ord a => a -> a -> Bool > Int 10) forall a b. (a -> b) -> a -> b $ String -> ShowS showString String "Dropped " forall b c a. (b -> c) -> (a -> b) -> a -> c . forall a. Show a => Int -> a -> ShowS showsPrec Int 11 SpanContext ctx {- | TraceFlags with the @sampled@ flag not set. This means that it is up to the sampling configuration to decide whether or not to sample the trace. -} defaultTraceFlags :: TraceFlags defaultTraceFlags :: TraceFlags defaultTraceFlags = Word8 -> TraceFlags TraceFlags Word8 0 -- | Will the trace associated with this @TraceFlags@ value be sampled? isSampled :: TraceFlags -> Bool isSampled :: TraceFlags -> Bool isSampled (TraceFlags Word8 flags) = Word8 flags forall a. Bits a => a -> Int -> Bool `testBit` Int 0 -- | Set the @sampled@ flag on the @TraceFlags@ setSampled :: TraceFlags -> TraceFlags setSampled :: TraceFlags -> TraceFlags setSampled (TraceFlags Word8 flags) = Word8 -> TraceFlags TraceFlags (Word8 flags forall a. Bits a => a -> Int -> a `setBit` Int 0) {- | Unset the @sampled@ flag on the @TraceFlags@. This means that the application may choose whether or not to emit this Trace. -} unsetSampled :: TraceFlags -> TraceFlags unsetSampled :: TraceFlags -> TraceFlags unsetSampled (TraceFlags Word8 flags) = Word8 -> TraceFlags TraceFlags (Word8 flags forall a. Bits a => a -> Int -> a `clearBit` Int 0) -- | Get the current bitmask for the @TraceFlags@, useful for serialization purposes. traceFlagsValue :: TraceFlags -> Word8 traceFlagsValue :: TraceFlags -> Word8 traceFlagsValue (TraceFlags Word8 flags) = Word8 flags {- | Create a @TraceFlags@, from an arbitrary @Word8@. Note that for backwards-compatibility reasons, no checking is performed to determine whether the @TraceFlags@ bitmask provided is valid. -} traceFlagsFromWord8 :: Word8 -> TraceFlags traceFlagsFromWord8 :: Word8 -> TraceFlags traceFlagsFromWord8 = Word8 -> TraceFlags TraceFlags {- | A `SpanContext` represents the portion of a `Span` which must be serialized and propagated along side of a distributed context. `SpanContext`s are immutable. -} -- The OpenTelemetry `SpanContext` representation conforms to the [W3C TraceContext -- specification](https://www.w3.org/TR/trace-context/). It contains two -- identifiers - a `TraceId` and a `SpanId` - along with a set of common -- `TraceFlags` and system-specific `TraceState` values. -- `TraceId` A valid trace identifier is a 16-byte array with at least one -- non-zero byte. -- `SpanId` A valid span identifier is an 8-byte array with at least one non-zero -- byte. -- `TraceFlags` contain details about the trace. Unlike TraceState values, -- TraceFlags are present in all traces. The current version of the specification -- only supports a single flag called [sampled](https://www.w3.org/TR/trace-context/#sampled-flag). -- `TraceState` carries vendor-specific trace identification data, represented as a list -- of key-value pairs. TraceState allows multiple tracing -- systems to participate in the same trace. It is fully described in the [W3C Trace Context -- specification](https://www.w3.org/TR/trace-context/#tracestate-header). -- The API MUST implement methods to create a `SpanContext`. These methods SHOULD be the only way to -- create a `SpanContext`. This functionality MUST be fully implemented in the API, and SHOULD NOT be -- overridable. data SpanContext = SpanContext { SpanContext -> TraceFlags traceFlags :: TraceFlags , SpanContext -> Bool isRemote :: Bool , SpanContext -> TraceId traceId :: TraceId , SpanContext -> SpanId spanId :: SpanId , SpanContext -> TraceState traceState :: TraceState -- TODO have to move TraceState impl from W3CTraceContext to here -- list of up to 32, remove rightmost if exceeded -- see w3c trace-context spec } deriving (Int -> SpanContext -> ShowS [SpanContext] -> ShowS SpanContext -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [SpanContext] -> ShowS $cshowList :: [SpanContext] -> ShowS show :: SpanContext -> String $cshow :: SpanContext -> String showsPrec :: Int -> SpanContext -> ShowS $cshowsPrec :: Int -> SpanContext -> ShowS Show, SpanContext -> SpanContext -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: SpanContext -> SpanContext -> Bool $c/= :: SpanContext -> SpanContext -> Bool == :: SpanContext -> SpanContext -> Bool $c== :: SpanContext -> SpanContext -> Bool Eq) newtype NonRecordingSpan = NonRecordingSpan SpanContext {- | A “log” that happens as part of a span. An operation that is too fast for its own span, but too unique to roll up into its parent span. Events contain a name, a timestamp, and an optional set of Attributes, along with a timestamp. Events represent an event that occurred at a specific time within a span’s workload. When creating an event, this is the version that you will use. Attributes added that exceed the configured attribute limits will be dropped, which is accounted for in the 'Event' structure. @since 0.0.1.0 -} data NewEvent = NewEvent { NewEvent -> Text newEventName :: Text -- ^ The name of an event. Ideally this should be a relatively unique, but low cardinality value. , NewEvent -> [(Text, Attribute)] newEventAttributes :: [(Text, Attribute)] -- ^ Additional context or metadata related to the event, (stack traces, callsites, etc.). , NewEvent -> Maybe Timestamp newEventTimestamp :: Maybe Timestamp -- ^ The time that the event occurred. -- -- If not specified, 'OpenTelemetry.Trace.getTimestamp' will be used to get a timestamp. } {- | A “log” that happens as part of a span. An operation that is too fast for its own span, but too unique to roll up into its parent span. Events contain a name, a timestamp, and an optional set of Attributes, along with a timestamp. Events represent an event that occurred at a specific time within a span’s workload. -} data Event = Event { Event -> Text eventName :: Text -- ^ The name of an event. Ideally this should be a relatively unique, but low cardinality value. , Event -> Attributes eventAttributes :: Attributes -- ^ Additional context or metadata related to the event, (stack traces, callsites, etc.). , Event -> Timestamp eventTimestamp :: Timestamp -- ^ The time that the event occurred. } deriving (Int -> Event -> ShowS [Event] -> ShowS Event -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Event] -> ShowS $cshowList :: [Event] -> ShowS show :: Event -> String $cshow :: Event -> String showsPrec :: Int -> Event -> ShowS $cshowsPrec :: Int -> Event -> ShowS Show) -- | Utility class to format arbitrary values to events. class ToEvent a where -- | Convert a value to an 'Event' -- -- @since 0.0.1.0 toEvent :: a -> Event {- | The outcome of a call to 'Sampler' indicating whether the 'Tracer' should sample a 'Span'. -} data SamplingResult = -- | isRecording == false. Span will not be recorded and all events and attributes will be dropped. Drop | -- | isRecording == true, but Sampled flag MUST NOT be set. RecordOnly | -- | isRecording == true, AND Sampled flag MUST be set. RecordAndSample deriving (Int -> SamplingResult -> ShowS [SamplingResult] -> ShowS SamplingResult -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [SamplingResult] -> ShowS $cshowList :: [SamplingResult] -> ShowS show :: SamplingResult -> String $cshow :: SamplingResult -> String showsPrec :: Int -> SamplingResult -> ShowS $cshowsPrec :: Int -> SamplingResult -> ShowS Show, SamplingResult -> SamplingResult -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: SamplingResult -> SamplingResult -> Bool $c/= :: SamplingResult -> SamplingResult -> Bool == :: SamplingResult -> SamplingResult -> Bool $c== :: SamplingResult -> SamplingResult -> Bool Eq) {- | Interface that allows users to create custom samplers which will return a sampling SamplingResult based on information that is typically available just before the Span was created. -} data Sampler = Sampler { Sampler -> Text getDescription :: Text -- ^ Returns the sampler name or short description with the configuration. This may be displayed on debug pages or in the logs. , Sampler -> Context -> TraceId -> Text -> SpanArguments -> IO (SamplingResult, [(Text, Attribute)], TraceState) shouldSample :: Context -> TraceId -> Text -> SpanArguments -> IO (SamplingResult, [(Text, Attribute)], TraceState) } data SpanLimits = SpanLimits { SpanLimits -> Maybe Int spanAttributeValueLengthLimit :: Maybe Int , SpanLimits -> Maybe Int spanAttributeCountLimit :: Maybe Int , SpanLimits -> Maybe Int eventCountLimit :: Maybe Int , SpanLimits -> Maybe Int eventAttributeCountLimit :: Maybe Int , SpanLimits -> Maybe Int linkCountLimit :: Maybe Int , SpanLimits -> Maybe Int linkAttributeCountLimit :: Maybe Int } deriving (Int -> SpanLimits -> ShowS [SpanLimits] -> ShowS SpanLimits -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [SpanLimits] -> ShowS $cshowList :: [SpanLimits] -> ShowS show :: SpanLimits -> String $cshow :: SpanLimits -> String showsPrec :: Int -> SpanLimits -> ShowS $cshowsPrec :: Int -> SpanLimits -> ShowS Show, SpanLimits -> SpanLimits -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: SpanLimits -> SpanLimits -> Bool $c/= :: SpanLimits -> SpanLimits -> Bool == :: SpanLimits -> SpanLimits -> Bool $c== :: SpanLimits -> SpanLimits -> Bool Eq) defaultSpanLimits :: SpanLimits defaultSpanLimits :: SpanLimits defaultSpanLimits = Maybe Int -> Maybe Int -> Maybe Int -> Maybe Int -> Maybe Int -> Maybe Int -> SpanLimits SpanLimits forall a. Maybe a Nothing forall a. Maybe a Nothing forall a. Maybe a Nothing forall a. Maybe a Nothing forall a. Maybe a Nothing forall a. Maybe a Nothing type Lens s t a b = forall f. Functor f => (a -> f b) -> s -> f t type Lens' s a = Lens s s a a {- | When sending tracing information across process boundaries, the @SpanContext@ is used to serialize the relevant information. -} getSpanContext :: MonadIO m => Span -> m SpanContext getSpanContext :: forall (m :: * -> *). MonadIO m => Span -> m SpanContext getSpanContext (Span IORef ImmutableSpan s) = forall (m :: * -> *) a. MonadIO m => IO a -> m a liftIO (ImmutableSpan -> SpanContext spanContext forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b <$> forall a. IORef a -> IO a readIORef IORef ImmutableSpan s) getSpanContext (FrozenSpan SpanContext c) = forall (f :: * -> *) a. Applicative f => a -> f a pure SpanContext c getSpanContext (Dropped SpanContext c) = forall (f :: * -> *) a. Applicative f => a -> f a pure SpanContext c