instana-haskell-trace-sdk-0.6.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.6.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)))

addData :: Value -> EntrySpan -> EntrySpan Source #

Add a value to the span's data section.

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.

spanData :: EntrySpan -> Value Source #

Optional additional span data.

spanId :: EntrySpan -> Id Source #

Accessor for the span ID.

spanName :: EntrySpan -> Text Source #

Name of span.

synthetic :: EntrySpan -> Bool Source #

The synthetic flag.

timestamp :: EntrySpan -> Int Source #

Start time.

traceId :: EntrySpan -> Id Source #

Accessor for the trace ID.