instana-haskell-trace-sdk-0.1.0.0: SDK for adding custom Instana tracing support to Haskell applications.

Safe HaskellNone
LanguageHaskell2010

Instana.SDK.Span.Span

Description

 

Synopsis

Documentation

data Span Source #

A span.

Constructors

Entry EntrySpan 
Exit ExitSpan 

Instances

Eq Span Source # 

Methods

(==) :: Span -> Span -> Bool #

(/=) :: Span -> Span -> Bool #

Show Span Source # 

Methods

showsPrec :: Int -> Span -> ShowS #

show :: Span -> String #

showList :: [Span] -> ShowS #

Generic Span Source # 

Associated Types

type Rep Span :: * -> * #

Methods

from :: Span -> Rep Span x #

to :: Rep Span x -> Span #

type Rep Span Source # 
type Rep Span = D1 * (MetaData "Span" "Instana.SDK.Span.Span" "instana-haskell-trace-sdk-0.1.0.0-3CQXt2Agule2wC3RZRWFKx" False) ((:+:) * (C1 * (MetaCons "Entry" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * EntrySpan))) (C1 * (MetaCons "Exit" PrefixI False) (S1 * (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * ExitSpan))))

data SpanKind Source #

The span kind (entry, exit or intermediate).

Constructors

EntryKind

The monitored componenent receives a call.

ExitKind

The monitored componenent calls something else.

Instances

Eq SpanKind Source # 
Show SpanKind Source # 
Generic SpanKind Source # 

Associated Types

type Rep SpanKind :: * -> * #

Methods

from :: SpanKind -> Rep SpanKind x #

to :: Rep SpanKind x -> SpanKind #

type Rep SpanKind Source # 
type Rep SpanKind = D1 * (MetaData "SpanKind" "Instana.SDK.Span.Span" "instana-haskell-trace-sdk-0.1.0.0-3CQXt2Agule2wC3RZRWFKx" False) ((:+:) * (C1 * (MetaCons "EntryKind" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "ExitKind" PrefixI False) (U1 *)) (C1 * (MetaCons "IntermediateKind" PrefixI False) (U1 *))))

traceId :: Span -> Id Source #

Accessor for the trace ID.

spanId :: Span -> Id Source #

Accessor for the span ID.

spanKind :: Span -> SpanKind Source #

Kind of span.

parentId :: Span -> Maybe Id Source #

Parent span ID.

spanName :: Span -> Text Source #

Name of span.

timestamp :: Span -> Int Source #

Start time.

errorCount :: Span -> Int Source #

Start time.

addToErrorCount :: Int -> Span -> Span Source #

Add to the error count.

spanData :: Span -> Value Source #

Optional additional span data.

addData :: Value -> Span -> Span Source #

Add a value to the span's data section.

addDataAt :: ToJSON a => Text -> a -> Span -> Span Source #

Add a value at the given path to the span's data section.