ghc-dump-util-0.2.1.0: Handy tools for working with ghc-dump dumps
Safe HaskellNone
LanguageHaskell2010

GhcDump.Pretty

Synopsis

Documentation

class Pretty a where #

Overloaded conversion to Doc.

Laws:

  1. output should be pretty. :-)

Minimal complete definition

pretty

Methods

pretty :: a -> Doc ann #

>>> pretty 1 <+> pretty "hello" <+> pretty 1.234
1 hello 1.234

prettyList :: [a] -> Doc ann #

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

>>> prettyList [1, 23, 456]
[1, 23, 456]

Instances

Instances details
Pretty Bool
>>> pretty True
True
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann #

prettyList :: [Bool] -> Doc ann #

Pretty Char

Instead of (pretty 'n'), consider using line as a more readable alternative.

>>> pretty 'f' <> pretty 'o' <> pretty 'o'
foo
>>> pretty ("string" :: String)
string
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann #

prettyList :: [Char] -> Doc ann #

Pretty Double
>>> pretty (exp 1 :: Double)
2.71828182845904...
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann #

prettyList :: [Double] -> Doc ann #

Pretty Float
>>> pretty (pi :: Float)
3.1415927
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann #

prettyList :: [Float] -> Doc ann #

Pretty Int
>>> pretty (123 :: Int)
123
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann #

prettyList :: [Int] -> Doc ann #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann #

prettyList :: [Int8] -> Doc ann #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann #

prettyList :: [Int16] -> Doc ann #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann #

prettyList :: [Int64] -> Doc ann #

Pretty Integer
>>> pretty (2^123 :: Integer)
10633823966279326983230456482242756608
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann #

prettyList :: [Integer] -> Doc ann #

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann #

prettyList :: [Natural] -> Doc ann #

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann #

prettyList :: [Word] -> Doc ann #

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann #

prettyList :: [Word8] -> Doc ann #

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann #

prettyList :: [Word16] -> Doc ann #

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann #

prettyList :: [Word32] -> Doc ann #

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann #

prettyList :: [Word64] -> Doc ann #

Pretty ()
>>> pretty ()
()

The argument is not used:

>>> pretty (error "Strict?" :: ())
()
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: () -> Doc ann #

prettyList :: [()] -> Doc ann #

Pretty Void

Finding a good example for printing something that does not exist is hard, so here is an example of printing a list full of nothing.

>>> pretty ([] :: [Void])
[]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann #

prettyList :: [Void] -> Doc ann #

Pretty Text

(lazy Text instance, identical to the strict version)

Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Pretty Text

Automatically converts all newlines to line.

>>> pretty ("hello\nworld" :: Text)
hello
world

Note that line can be undone by group:

>>> group (pretty ("hello\nworld" :: Text))
hello world

Manually use hardline if you definitely want newlines.

Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

Pretty Unique Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Unique -> Doc ann #

prettyList :: [Unique] -> Doc ann #

Pretty ExternalName Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: ExternalName -> Doc ann #

prettyList :: [ExternalName] -> Doc ann #

Pretty BinderId Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: BinderId -> Doc ann #

prettyList :: [BinderId] -> Doc ann #

Pretty Binder Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Binder -> Doc ann #

prettyList :: [Binder] -> Doc ann #

Pretty OccInfo Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: OccInfo -> Doc ann #

prettyList :: [OccInfo] -> Doc ann #

Pretty IdDetails Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: IdDetails -> Doc ann #

prettyList :: [IdDetails] -> Doc ann #

Pretty Lit Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Lit -> Doc ann #

prettyList :: [Lit] -> Doc ann #

Pretty TyCon Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: TyCon -> Doc ann #

prettyList :: [TyCon] -> Doc ann #

Pretty Type Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Type -> Doc ann #

prettyList :: [Type] -> Doc ann #

Pretty ModuleName Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: ModuleName -> Doc ann #

prettyList :: [ModuleName] -> Doc ann #

Pretty Module Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Module -> Doc ann #

prettyList :: [Module] -> Doc ann #

Pretty Expr Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: Expr -> Doc ann #

prettyList :: [Expr] -> Doc ann #

Pretty AltCon Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: AltCon -> Doc ann #

prettyList :: [AltCon] -> Doc ann #

Pretty TopBinding Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: TopBinding -> Doc ann #

prettyList :: [TopBinding] -> Doc ann #

Pretty CoreStats Source # 
Instance details

Defined in GhcDump.Pretty

Methods

pretty :: CoreStats -> Doc ann #

prettyList :: [CoreStats] -> Doc ann #

Pretty a => Pretty [a]
>>> pretty [1,2,3]
[1, 2, 3]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: [a] -> Doc ann #

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

Pretty a => Pretty (Maybe a)

Ignore Nothings, print Just contents.

>>> pretty (Just True)
True
>>> braces (pretty (Nothing :: Maybe Bool))
{}
>>> pretty [Just 1, Nothing, Just 3, Nothing]
[1, 3]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann #

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

Pretty a => Pretty (Identity a)
>>> pretty (Identity 1)
1
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann #

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

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann #

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

(Pretty a1, Pretty a2) => Pretty (a1, a2)
>>> pretty (123, "hello")
(123, hello)
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: (a1, a2) -> Doc ann #

prettyList :: [(a1, a2)] -> Doc ann #

(Pretty a1, Pretty a2, Pretty a3) => Pretty (a1, a2, a3)
>>> pretty (123, "hello", False)
(123, hello, False)
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: (a1, a2, a3) -> Doc ann #

prettyList :: [(a1, a2, a3)] -> Doc ann #

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

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann #

prettyList :: [Const a b] -> Doc ann #

data TyPrec Source #

Instances

Instances details
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

(<$$>) :: Doc ann -> Doc ann -> Doc ann Source #

maybeParens :: Bool -> Doc ann -> Doc ann Source #

pprTick :: Tick -> Doc ann Source #

comment :: Doc ann -> Doc ann Source #

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

ppWhen :: Bool -> Doc ann -> Doc ann Source #

Orphan instances

Pretty Unique Source # 
Instance details

Methods

pretty :: Unique -> Doc ann #

prettyList :: [Unique] -> Doc ann #

Pretty ExternalName Source # 
Instance details

Methods

pretty :: ExternalName -> Doc ann #

prettyList :: [ExternalName] -> Doc ann #

Pretty BinderId Source # 
Instance details

Methods

pretty :: BinderId -> Doc ann #

prettyList :: [BinderId] -> Doc ann #

Pretty Binder Source # 
Instance details

Methods

pretty :: Binder -> Doc ann #

prettyList :: [Binder] -> Doc ann #

Pretty OccInfo Source # 
Instance details

Methods

pretty :: OccInfo -> Doc ann #

prettyList :: [OccInfo] -> Doc ann #

Pretty IdDetails Source # 
Instance details

Methods

pretty :: IdDetails -> Doc ann #

prettyList :: [IdDetails] -> Doc ann #

Pretty Lit Source # 
Instance details

Methods

pretty :: Lit -> Doc ann #

prettyList :: [Lit] -> Doc ann #

Pretty TyCon Source # 
Instance details

Methods

pretty :: TyCon -> Doc ann #

prettyList :: [TyCon] -> Doc ann #

Pretty Type Source # 
Instance details

Methods

pretty :: Type -> Doc ann #

prettyList :: [Type] -> Doc ann #

Pretty ModuleName Source # 
Instance details

Methods

pretty :: ModuleName -> Doc ann #

prettyList :: [ModuleName] -> Doc ann #

Pretty Module Source # 
Instance details

Methods

pretty :: Module -> Doc ann #

prettyList :: [Module] -> Doc ann #

Pretty Expr Source # 
Instance details

Methods

pretty :: Expr -> Doc ann #

prettyList :: [Expr] -> Doc ann #

Pretty AltCon Source # 
Instance details

Methods

pretty :: AltCon -> Doc ann #

prettyList :: [AltCon] -> Doc ann #

Pretty TopBinding Source # 
Instance details

Methods

pretty :: TopBinding -> Doc ann #

prettyList :: [TopBinding] -> Doc ann #

Pretty CoreStats Source # 
Instance details

Methods

pretty :: CoreStats -> Doc ann #

prettyList :: [CoreStats] -> Doc ann #