opentelemetry-0.7.0
Safe HaskellNone
LanguageHaskell2010

OpenTelemetry.Eventlog

Contents

Synopsis

Spans

withSpan :: forall m a. (MonadIO m, MonadMask m) => ByteString -> (SpanInFlight -> m a) -> m a Source #

withSpan_ :: (MonadIO m, MonadMask m) => ByteString -> m a -> m a Source #

Metrics

add :: MonadIO m => Instrument 'Synchronous 'Additive m' -> Int -> m () Source #

Take a measurement for a synchronous, additive instrument (Counter, UpDownCounter)

record :: MonadIO m => Instrument 'Synchronous 'NonAdditive m' -> Int -> m () Source #

Take a measurement for a synchronous, non-additive instrument (ValueRecorder)

observe :: MonadIO m => Instrument 'Asynchronous a m' -> Int -> m () Source #

Take a measurement for an asynchronous instrument (SumObserver, UpDownSumObserver, ValueObserver)

data Instrument (s :: Synchronicity) (a :: Additivity) (m :: Monotonicity) Source #

An OpenTelemetry instrument as defined in the OpenTelemetry Metrics API (https://github.com/open-telemetry/opentelemetry-specification/blob/master/specification/metrics/api.md)

Instances

Instances details
Eq (Instrument s a m) Source # 
Instance details

Defined in OpenTelemetry.Metrics_Internal

Methods

(==) :: Instrument s a m -> Instrument s a m -> Bool #

(/=) :: Instrument s a m -> Instrument s a m -> Bool #

Show (Instrument s a m) Source # 
Instance details

Defined in OpenTelemetry.Metrics_Internal

Methods

showsPrec :: Int -> Instrument s a m -> ShowS #

show :: Instrument s a m -> String #

showList :: [Instrument s a m] -> ShowS #

Hashable (Instrument s a m) Source # 
Instance details

Defined in OpenTelemetry.Metrics_Internal

Methods

hashWithSalt :: Int -> Instrument s a m -> Int #

hash :: Instrument s a m -> Int #

data SomeInstrument Source #

Existential wrapper for Instrument. Use when the exact type of Instrument does not matter.

Constructors

forall s a m. SomeInstrument (Instrument s a m)