instana-haskell-trace-sdk-0.10.2.0: SDK for adding custom Instana tracing support to Haskell applications.
Safe HaskellNone
LanguageHaskell2010

Instana.SDK.Span.EntrySpan

Description

 
Synopsis

Documentation

data EntrySpan Source #

An entry span.

Instances

Instances details
Eq EntrySpan Source # 
Instance details

Defined in Instana.SDK.Span.EntrySpan

Show EntrySpan Source # 
Instance details

Defined in Instana.SDK.Span.EntrySpan

Generic EntrySpan Source # 
Instance details

Defined in Instana.SDK.Span.EntrySpan

Associated Types

type Rep EntrySpan :: Type -> Type #

type Rep EntrySpan Source # 
Instance details

Defined in Instana.SDK.Span.EntrySpan

type Rep EntrySpan = D1 ('MetaData "EntrySpan" "Instana.SDK.Span.EntrySpan" "instana-haskell-trace-sdk-0.10.2.0-inplace" 'False) (C1 ('MetaCons "RootEntrySpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RootEntry)) :+: C1 ('MetaCons "NonRootEntrySpan" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NonRootEntry)))

addAnnotation :: Annotation -> EntrySpan -> EntrySpan Source #

Add an annotation to the span's data section. For SDK spans, the annotation is added to span.data.sdk.custom.tags, for registered spans it is added directly to span.data.

addToErrorCount :: Int -> EntrySpan -> EntrySpan Source #

Add to the error count.

correlationId :: EntrySpan -> Maybe Text Source #

The website monitoring correlation ID.

correlationType :: EntrySpan -> Maybe Text Source #

The website monitoring correlation type.

errorCount :: EntrySpan -> Int Source #

Error count (error that occured while this span has been active).

parentId :: EntrySpan -> Maybe Id Source #

Parent span ID.

serviceName :: EntrySpan -> Maybe Text Source #

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

setCorrelationId :: Text -> EntrySpan -> EntrySpan 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 -> EntrySpan -> EntrySpan 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 -> EntrySpan -> EntrySpan Source #

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

setSynthetic :: Bool -> EntrySpan -> EntrySpan Source #

Set the synthetic flag. This should only be set on entry spans. It will be silently ignored for other types of spans.

setTpFlag :: EntrySpan -> EntrySpan Source #

Set the span.tp flag. A span with span.tp = True has inherited the trace ID/ parent ID from W3C trace context instead of Instana headers. Only valid for non-root entry spans, will be silently ignored for root entry spans and exit spans.

setW3cTraceContext :: W3CTraceContext -> EntrySpan -> EntrySpan Source #

Attaches a W3C trace context to the span.

spanData :: EntrySpan -> SpanData Source #

Optional additional span data.

spanId :: EntrySpan -> Id Source #

Accessor for the span ID.

spanName :: EntrySpan -> Text Source #

Name of span.

spanType :: EntrySpan -> SpanType Source #

Type of span (registerd span vs. SDK span)

synthetic :: EntrySpan -> Bool Source #

The synthetic flag.

tpFlag :: EntrySpan -> Bool Source #

The span.tp flag. A span with span.tp = True has inherited the trace ID/ parent ID from W3C trace context instead of Instana headers. Only valid for entry spans.

timestamp :: EntrySpan -> Int Source #

Start time.

traceId :: EntrySpan -> Id Source #

Accessor for the trace ID.

w3cTraceContext :: EntrySpan -> Maybe W3CTraceContext Source #

The W3C Trace Context. An entry span only has an associated W3C trace context, if W3C trace context headers have been received. In contrast, exit spans always have an associated W3C trace context.