{-# LANGUAGE CPP #-}
module GHC.Prof
( decode
, decode'
, profile
, CostCentreTree
, aggregatedCostCentres
, aggregatedCostCentresOrderBy
, costCentres
, costCentresOrderBy
, aggregateCallSites
, aggregateCallSitesOrderBy
, callSites
, callSitesOrderBy
, aggregateModules
, aggregateModulesOrderBy
, Profile(..)
, TotalTime(..)
, TotalAlloc(..)
, AggregatedCostCentre(..)
, CostCentre(..)
, CostCentreNo
, CallSite(..)
, AggregateModule(..)
) where
#if !MIN_VERSION_base(4, 13, 0)
import Control.Applicative ((<*))
#endif
import qualified Data.Attoparsec.Text.Lazy as ATL
import qualified Data.Attoparsec.Text as AT
import qualified Data.Text.Lazy as TL
import qualified Data.Text as T
import GHC.Prof.CostCentreTree
import GHC.Prof.Parser (profile)
import GHC.Prof.Types
decode :: TL.Text -> Either String Profile
decode :: Text -> Either String Profile
decode Text
text = case forall a. Parser a -> Text -> Result a
ATL.parse Parser Profile
profile Text
text of
ATL.Fail Text
_unconsumed [String]
_contexts String
reason -> forall a b. a -> Either a b
Left String
reason
ATL.Done Text
_unconsumed Profile
prof -> forall a b. b -> Either a b
Right Profile
prof
decode' :: T.Text -> Either String Profile
decode' :: Text -> Either String Profile
decode' Text
text = forall a. Parser a -> Text -> Either String a
AT.parseOnly (Parser Profile
profile forall (f :: * -> *) a b. Applicative f => f a -> f b -> f a
<* forall t. Chunk t => Parser t ()
AT.endOfInput) Text
text