instana-haskell-trace-sdk-0.5.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

Instances details
Eq Span Source # 
Instance details

Defined in Instana.SDK.Span.Span

Methods

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

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

Show Span Source # 
Instance details

Defined in Instana.SDK.Span.Span

Methods

showsPrec :: Int -> Span -> ShowS #

show :: Span -> String #

showList :: [Span] -> ShowS #

Generic Span Source # 
Instance details

Defined in Instana.SDK.Span.Span

Associated Types

type Rep Span :: Type -> Type #

Methods

from :: Span -> Rep Span x #

to :: Rep Span x -> Span #

type Rep Span Source # 
Instance details

Defined in Instana.SDK.Span.Span

type Rep Span = D1 ('MetaData "Span" "Instana.SDK.Span.Span" "instana-haskell-trace-sdk-0.5.0.0-CC1L5pLij5V4IZu4epwYU5" 'False) (C1 ('MetaCons "Entry" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EntrySpan)) :+: C1 ('MetaCons "Exit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe 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.

IntermediateKind

An additional annotation that is added to the trace while a traced call is being processed.

Instances

Instances details
Eq SpanKind Source # 
Instance details

Defined in Instana.SDK.Span.Span

Show SpanKind Source # 
Instance details

Defined in Instana.SDK.Span.Span

Generic SpanKind Source # 
Instance details

Defined in Instana.SDK.Span.Span

Associated Types

type Rep SpanKind :: Type -> Type #

Methods

from :: SpanKind -> Rep SpanKind x #

to :: Rep SpanKind x -> SpanKind #

type Rep SpanKind Source # 
Instance details

Defined in Instana.SDK.Span.Span

type Rep SpanKind = D1 ('MetaData "SpanKind" "Instana.SDK.Span.Span" "instana-haskell-trace-sdk-0.5.0.0-CC1L5pLij5V4IZu4epwYU5" 'False) (C1 ('MetaCons "EntryKind" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ExitKind" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IntermediateKind" 'PrefixI 'False) (U1 :: Type -> Type)))

addRegisteredData :: Value -> Span -> Span Source #

Add a value to the span's data section. This should only be used for registered spans, not for SDK spans. For SDK spans, you should use addTag instead.

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

Add a value at the given path to the span's data section. For SDK spans, you should use addTagAt instead.

addTag :: Value -> Span -> Span Source #

Add a value to the span's custom tags section. This should be used for SDK spans instead of addRegisteredData.

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

Add a value to the given path to the span's custom tags section. This should be used for SDK spans instead of addRegisteredDataAt.

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

Add to the error count.

correlationId :: Span -> Maybe Text Source #

The website monitoring correlation ID.

correlationType :: Span -> Maybe Text Source #

The website monitoring correlation type.

errorCount :: Span -> Int Source #

Error count.

parentId :: Span -> Maybe Id Source #

Parent span ID.

serviceName :: Span -> Maybe Text Source #

An optional attribute for overriding the name of the service in Instana.

setCorrelationId :: Text -> Span -> Span Source #

Set the website monitoring correlation ID. This should only be set on root entry spans. It will be silently ignored for other types of spans.

setCorrelationType :: Text -> Span -> Span Source #

Set the website monitoring correlation type. This should only be set on root entry spans. It will be silently ignored for other types of spans.

setServiceName :: Text -> Span -> Span Source #

Override the name of the service for the associated call in Instana.

spanData :: Span -> Value Source #

Optional additional span data.

spanId :: Span -> Id Source #

Accessor for the span ID.

spanKind :: Span -> SpanKind Source #

Kind of span.

spanName :: Span -> Text Source #

Name of span.

timestamp :: Span -> Int Source #

Start time.

traceId :: Span -> Id Source #

Accessor for the trace ID.