Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- type Timestamp = Word64
- newtype SpanName = SpanName Text
- newtype TagName = TagName Text
- newtype TagVal = TagVal Text
- newtype EventName = EventName Text
- newtype EventVal = EventVal Text
- data TagValue
- class ToTagValue a where
- toTagValue :: a -> TagValue
- data Span = Span {
- spanContext :: !SpanContext
- spanOperation :: Text
- spanThreadId :: Word32
- spanDisplayThreadId :: Word32
- spanStartedAt :: !Timestamp
- spanFinishedAt :: !Timestamp
- spanTags :: !(HashMap TagName TagValue)
- spanEvents :: [SpanEvent]
- spanStatus :: !SpanStatus
- spanParentId :: Maybe SpanId
- spanNanosecondsSpentInGC :: !Word64
- data InstrumentType
- data CaptureInstrument = CaptureInstrument {}
- data Metric = Metric {}
- data AggregatedMetric = AggregatedMetric {}
- data MetricDatapoint a = MetricDatapoint {}
- spanTraceId :: Span -> TraceId
- spanId :: Span -> SpanId
- data SpanEvent = SpanEvent {}
- data SpanStatus = OK
- data Event = Event Text Timestamp
- data SpanProcessor = SpanProcessor {}
- data OpenTelemetryConfig = OpenTelemetryConfig {}
- data ExportResult
- data Exporter thing = Exporter {
- export :: [thing] -> IO ExportResult
- shutdown :: IO ()
- readInstrumentTag :: Int8 -> Maybe InstrumentType
- additive :: InstrumentType -> Bool
- noopExporter :: Exporter whatever
- aggregated :: Exporter AggregatedMetric -> IO (Exporter Metric)
- now64 :: IO Timestamp
Documentation
class ToTagValue a where Source #
toTagValue :: a -> TagValue Source #
Instances
ToTagValue Bool Source # | |
Defined in OpenTelemetry.Common toTagValue :: Bool -> TagValue Source # | |
ToTagValue Int Source # | |
Defined in OpenTelemetry.Common toTagValue :: Int -> TagValue Source # | |
ToTagValue String Source # | |
Defined in OpenTelemetry.Common toTagValue :: String -> TagValue Source # | |
ToTagValue Text Source # | |
Defined in OpenTelemetry.Common toTagValue :: Text -> TagValue Source # | |
ToTagValue TagVal Source # | |
Defined in OpenTelemetry.Common toTagValue :: TagVal -> TagValue Source # |
Span | |
|
data InstrumentType Source #
Reflects the constructors of Instrument
CounterType | |
UpDownCounterType | |
ValueRecorderType | |
SumObserverType | |
UpDownSumObserverType | |
ValueObserverType |
Instances
data CaptureInstrument Source #
Instances
data AggregatedMetric Source #
Instances
Eq AggregatedMetric Source # | |
Defined in OpenTelemetry.Common (==) :: AggregatedMetric -> AggregatedMetric -> Bool # (/=) :: AggregatedMetric -> AggregatedMetric -> Bool # | |
Show AggregatedMetric Source # | |
Defined in OpenTelemetry.Common showsPrec :: Int -> AggregatedMetric -> ShowS # show :: AggregatedMetric -> String # showList :: [AggregatedMetric] -> ShowS # |
data MetricDatapoint a Source #
Instances
Functor MetricDatapoint Source # | |
Defined in OpenTelemetry.Common fmap :: (a -> b) -> MetricDatapoint a -> MetricDatapoint b # (<$) :: a -> MetricDatapoint b -> MetricDatapoint a # | |
Eq a => Eq (MetricDatapoint a) Source # | |
Defined in OpenTelemetry.Common (==) :: MetricDatapoint a -> MetricDatapoint a -> Bool # (/=) :: MetricDatapoint a -> MetricDatapoint a -> Bool # | |
Show a => Show (MetricDatapoint a) Source # | |
Defined in OpenTelemetry.Common showsPrec :: Int -> MetricDatapoint a -> ShowS # show :: MetricDatapoint a -> String # showList :: [MetricDatapoint a] -> ShowS # |
spanTraceId :: Span -> TraceId Source #
Instances
data SpanStatus Source #
Instances
Eq SpanStatus Source # | |
Defined in OpenTelemetry.Common (==) :: SpanStatus -> SpanStatus -> Bool # (/=) :: SpanStatus -> SpanStatus -> Bool # | |
Show SpanStatus Source # | |
Defined in OpenTelemetry.Common showsPrec :: Int -> SpanStatus -> ShowS # show :: SpanStatus -> String # showList :: [SpanStatus] -> ShowS # |
data SpanProcessor Source #
data ExportResult Source #
Instances
Eq ExportResult Source # | |
Defined in OpenTelemetry.Common (==) :: ExportResult -> ExportResult -> Bool # (/=) :: ExportResult -> ExportResult -> Bool # | |
Show ExportResult Source # | |
Defined in OpenTelemetry.Common showsPrec :: Int -> ExportResult -> ShowS # show :: ExportResult -> String # showList :: [ExportResult] -> ShowS # |
additive :: InstrumentType -> Bool Source #
noopExporter :: Exporter whatever Source #
aggregated :: Exporter AggregatedMetric -> IO (Exporter Metric) Source #