Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- class Pretty a where
- pretty :: a -> Doc
- prettyList :: [a] -> Doc
- data TyPrec
- data PrettyOpts = PrettyOpts {
- showUniques :: Bool
- showIdInfo :: Bool
- showLetTypes :: Bool
- showUnfoldings :: Bool
- defaultPrettyOpts :: PrettyOpts
- pprBinder :: PrettyOpts -> Binder -> Doc
- pprRational :: Rational -> Doc
- pprIdInfo :: PrettyOpts -> IdInfo Binder Binder -> IdDetails -> Doc
- pprUnfolding :: PrettyOpts -> Unfolding Binder Binder -> Doc
- pprType :: PrettyOpts -> Type -> Doc
- pprType' :: PrettyOpts -> TyPrec -> Type -> Doc
- maybeParens :: Bool -> Doc -> Doc
- pprExpr :: PrettyOpts -> Expr -> Doc
- pprExpr' :: PrettyOpts -> Bool -> Expr -> Doc
- pprTopBinding :: PrettyOpts -> TopBinding -> Doc
- pprTypeSig :: PrettyOpts -> Binder -> Doc
- pprBinding :: PrettyOpts -> Binder -> Expr -> Doc
- pprModule :: PrettyOpts -> Module -> Doc
- comment :: Doc -> Doc
- dcolon :: Doc
- smallRArrow :: Doc
- hang' :: Doc -> Int -> Doc -> Doc
- ppWhen :: Bool -> Doc -> Doc
Documentation
The member prettyList
is only used to define the instance Pretty
a => Pretty [a]
. In normal circumstances only the pretty
function
is used.
Instances
data PrettyOpts Source #
PrettyOpts | |
|
pprRational :: Rational -> Doc Source #
pprUnfolding :: PrettyOpts -> Unfolding Binder Binder -> Doc Source #
pprTopBinding :: PrettyOpts -> TopBinding -> Doc Source #
pprTypeSig :: PrettyOpts -> Binder -> Doc Source #
pprBinding :: PrettyOpts -> Binder -> Expr -> Doc Source #
smallRArrow :: Doc Source #
Orphan instances
Pretty Text Source # | |
Pretty Unique Source # | |
Pretty ExternalName Source # | |
pretty :: ExternalName -> Doc # prettyList :: [ExternalName] -> Doc # | |
Pretty BinderId Source # | |
Pretty Binder Source # | |
Pretty OccInfo Source # | |
Pretty IdDetails Source # | |
Pretty Lit Source # | |
Pretty TyCon Source # | |
Pretty Type Source # | |
Pretty ModuleName Source # | |
pretty :: ModuleName -> Doc # prettyList :: [ModuleName] -> Doc # | |
Pretty Module Source # | |
Pretty Expr Source # | |
Pretty AltCon Source # | |
Pretty TopBinding Source # | |
pretty :: TopBinding -> Doc # prettyList :: [TopBinding] -> Doc # | |
Pretty CoreStats Source # | |