Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data DebugTag = DT {}
- data DebugContext = DC {
- previousTag :: !(Maybe DebugTag)
- currentTag :: !DebugTag
- propagation :: !Propagation
- definitionSite :: !(Maybe DefinitionSite)
- data Propagation
- data SrcCodeLoc = SrcCodeLoc {}
- type DefinitionSite = SrcCodeLoc
- type CallSite = SrcCodeLoc
- type DebugIP = (?_debug_ip :: Maybe DebugContext, HasCallStack)
- type TraceMute = DebugIP
- type TraceDeep = DebugIP
- type TraceDeepKey (key :: Symbol) = DebugIP
- type Trace = DebugIP
- type TraceKey (key :: Symbol) = DebugIP
- type TraceInert = DebugIP
- data Event
- = EntryEvent !DebugTag !(Maybe DebugTag) !(Maybe DefinitionSite) !(Maybe CallSite)
- | TraceEvent !DebugTag !MessageContent !(Maybe CallSite)
- eventToLogStr :: Event -> ByteString
- type FunName = String
- type UserKey = String
- type SrcModule = String
- type SrcLine = Int
- type SrcCol = Int
- callStackToCallSite :: CallStack -> Maybe CallSite
- data DebugNames = DebugNames {}
Documentation
data DebugContext Source #
DC | |
|
data Propagation Source #
Mute | Does not output traces, overrides other options |
Inert | Does not output traces, doesn't override other options |
Shallow | Outputs traces for current scope, but does not propagate |
Deep | Outputs traces and propagates to descendents |
Instances
Eq Propagation Source # | |
Defined in Graph.Trace.Internal.Types (==) :: Propagation -> Propagation -> Bool # (/=) :: Propagation -> Propagation -> Bool # | |
Show Propagation Source # | |
Defined in Graph.Trace.Internal.Types showsPrec :: Int -> Propagation -> ShowS # show :: Propagation -> String # showList :: [Propagation] -> ShowS # | |
Lift Propagation Source # | |
Defined in Graph.Trace.Internal.Types lift :: Propagation -> Q Exp # liftTyped :: Propagation -> Q (TExp Propagation) # |
data SrcCodeLoc Source #
Instances
Lift SrcCodeLoc Source # | |
Defined in Graph.Trace.Internal.Types lift :: SrcCodeLoc -> Q Exp # liftTyped :: SrcCodeLoc -> Q (TExp SrcCodeLoc) # |
type DefinitionSite = SrcCodeLoc Source #
type CallSite = SrcCodeLoc Source #
type DebugIP = (?_debug_ip :: Maybe DebugContext, HasCallStack) Source #
type TraceDeepKey (key :: Symbol) = DebugIP Source #
type TraceInert = DebugIP Source #
EntryEvent | |
TraceEvent !DebugTag !MessageContent !(Maybe CallSite) |
eventToLogStr :: Event -> ByteString Source #
Serialize an Event. The § character is used as both a separator and terminator. Don't use this character in trace messages, it will break!
data DebugNames Source #