{-# LANGUAGE TemplateHaskell #-} module GHC.RTS.Events.Analyze.Types ( EventId(..) , Options(..) , EventAnalysis(..) , events , threadInfo , openEvents , startup , shutdown , numThreads , inWindow , Quantized(..) , GroupId , showEventId , isUserEvent , isThreadEvent ) where import Control.Lens (Lens', makeLenses, at, (^.)) import Data.Map (Map) import GHC.RTS.Events (Timestamp, ThreadId) import qualified Data.Map as Map -- | Event identifiers -- -- The order of the constructors matters because it dictates the default -- ordering in the output SVG data EventId = -- | Garbage collection EventGC -- | User events -- -- To use user events, do -- -- > traceEventIO "START