ghc-dump-util-0.1.1.0: Handy tools for working with @ghc-dump@ dumps.

Safe HaskellNone
LanguageHaskell2010

GhcDump.Pretty

Contents

Synopsis

Documentation

class Pretty a where #

The member prettyList is only used to define the instance Pretty a => Pretty [a]. In normal circumstances only the pretty function is used.

Minimal complete definition

pretty

Methods

pretty :: a -> Doc #

prettyList :: [a] -> Doc #

Instances
Pretty Bool 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Bool -> Doc #

prettyList :: [Bool] -> Doc #

Pretty Char 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Char -> Doc #

prettyList :: [Char] -> Doc #

Pretty Double 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Double -> Doc #

prettyList :: [Double] -> Doc #

Pretty Float 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Float -> Doc #

prettyList :: [Float] -> Doc #

Pretty Int 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Int -> Doc #

prettyList :: [Int] -> Doc #

Pretty Integer 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Integer -> Doc #

prettyList :: [Integer] -> Doc #

Pretty () 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: () -> Doc #

prettyList :: [()] -> Doc #

Pretty Doc 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Doc -> Doc #

prettyList :: [Doc] -> Doc #

Pretty Text Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Text -> Doc #

prettyList :: [Text] -> Doc #

Pretty Unique Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Unique -> Doc #

prettyList :: [Unique] -> Doc #

Pretty ExternalName Source # 
Instance details

Defined in GhcDump.Pretty

Pretty BinderId Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: BinderId -> Doc #

prettyList :: [BinderId] -> Doc #

Pretty Binder Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Binder -> Doc #

prettyList :: [Binder] -> Doc #

Pretty OccInfo Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: OccInfo -> Doc #

prettyList :: [OccInfo] -> Doc #

Pretty IdDetails Source # 
Instance details

Defined in GhcDump.Pretty

Pretty Lit Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Lit -> Doc #

prettyList :: [Lit] -> Doc #

Pretty TyCon Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: TyCon -> Doc #

prettyList :: [TyCon] -> Doc #

Pretty Type Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Type -> Doc #

prettyList :: [Type] -> Doc #

Pretty ModuleName Source # 
Instance details

Defined in GhcDump.Pretty

Pretty Module Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Module -> Doc #

prettyList :: [Module] -> Doc #

Pretty Expr Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Expr -> Doc #

prettyList :: [Expr] -> Doc #

Pretty AltCon Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: AltCon -> Doc #

prettyList :: [AltCon] -> Doc #

Pretty TopBinding Source # 
Instance details

Defined in GhcDump.Pretty

Pretty CoreStats Source # 
Instance details

Defined in GhcDump.Pretty

Pretty a => Pretty [a] 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: [a] -> Doc #

prettyList :: [[a]] -> Doc #

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: Maybe a -> Doc #

prettyList :: [Maybe a] -> Doc #

(Pretty a, Pretty b) => Pretty (a, b) 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: (a, b) -> Doc #

prettyList :: [(a, b)] -> Doc #

(Pretty a, Pretty b, Pretty c) => Pretty (a, b, c) 
Instance details

Defined in Text.PrettyPrint.ANSI.Leijen.Internal

Methods

pretty :: (a, b, c) -> Doc #

prettyList :: [(a, b, c)] -> Doc #

data TyPrec Source #

Instances
Eq TyPrec Source # 
Instance details

Defined in GhcDump.Pretty

Methods

(==) :: TyPrec -> TyPrec -> Bool #

(/=) :: TyPrec -> TyPrec -> Bool #

Ord TyPrec Source # 
Instance details

Defined in GhcDump.Pretty

hang' :: Doc -> Int -> Doc -> Doc Source #

Orphan instances

Pretty Text Source # 
Instance details

Methods

pretty :: Text -> Doc #

prettyList :: [Text] -> Doc #

Pretty Unique Source # 
Instance details

Methods

pretty :: Unique -> Doc #

prettyList :: [Unique] -> Doc #

Pretty ExternalName Source # 
Instance details

Pretty BinderId Source # 
Instance details

Methods

pretty :: BinderId -> Doc #

prettyList :: [BinderId] -> Doc #

Pretty Binder Source # 
Instance details

Methods

pretty :: Binder -> Doc #

prettyList :: [Binder] -> Doc #

Pretty OccInfo Source # 
Instance details

Methods

pretty :: OccInfo -> Doc #

prettyList :: [OccInfo] -> Doc #

Pretty IdDetails Source # 
Instance details

Pretty Lit Source # 
Instance details

Methods

pretty :: Lit -> Doc #

prettyList :: [Lit] -> Doc #

Pretty TyCon Source # 
Instance details

Methods

pretty :: TyCon -> Doc #

prettyList :: [TyCon] -> Doc #

Pretty Type Source # 
Instance details

Methods

pretty :: Type -> Doc #

prettyList :: [Type] -> Doc #

Pretty ModuleName Source # 
Instance details

Pretty Module Source # 
Instance details

Methods

pretty :: Module -> Doc #

prettyList :: [Module] -> Doc #

Pretty Expr Source # 
Instance details

Methods

pretty :: Expr -> Doc #

prettyList :: [Expr] -> Doc #

Pretty AltCon Source # 
Instance details

Methods

pretty :: AltCon -> Doc #

prettyList :: [AltCon] -> Doc #

Pretty TopBinding Source # 
Instance details

Pretty CoreStats Source # 
Instance details