Safe Haskell | None |
---|---|
Language | Haskell2010 |
Language.Haskell.TH.Ppr
Description
contains a prettyprinter for the Template Haskell datatypes
- nestDepth :: Int
- type Precedence = Int
- appPrec :: Precedence
- unopPrec :: Precedence
- opPrec :: Precedence
- noPrec :: Precedence
- parensIf :: Bool -> Doc -> Doc
- pprint :: Ppr a => a -> String
- class Ppr a where
- ppr_sig :: Name -> Type -> Doc
- pprFixity :: Name -> Fixity -> Doc
- pprPrefixOcc :: Name -> Doc
- isSymOcc :: Name -> Bool
- isSymbolASCII :: Char -> Bool
- pprInfixExp :: Exp -> Doc
- pprExp :: Precedence -> Exp -> Doc
- pprFields :: [(Name, Exp)] -> Doc
- pprMaybeExp :: Precedence -> Maybe Exp -> Doc
- pprGuarded :: Doc -> (Guard, Exp) -> Doc
- pprBody :: Bool -> Body -> Doc
- pprLit :: Precedence -> Lit -> Doc
- bytesToString :: [Word8] -> String
- pprString :: String -> Doc
- pprPat :: Precedence -> Pat -> Doc
- ppr_dec :: Bool -> Dec -> Doc
- ppr_data :: Doc -> Cxt -> Name -> Doc -> Maybe Kind -> [Con] -> Cxt -> Doc
- ppr_newtype :: Doc -> Cxt -> Name -> Doc -> Maybe Kind -> Con -> Cxt -> Doc
- ppr_tySyn :: Doc -> Name -> Doc -> Type -> Doc
- ppr_tf_head :: TypeFamilyHead -> Doc
- commaSepApplied :: [Name] -> Doc
- pprForall :: [TyVarBndr] -> Cxt -> Doc
- pprRecFields :: [(Name, Strict, Type)] -> Type -> Doc
- pprGadtRHS :: [(Strict, Type)] -> Type -> Doc
- pprVarBangType :: VarBangType -> Doc
- pprBangType :: BangType -> Doc
- pprVarStrictType :: (Name, Strict, Type) -> Doc
- pprStrictType :: (Strict, Type) -> Doc
- pprParendType :: Type -> Doc
- pprUInfixT :: Type -> Doc
- pprTyApp :: (Type, [Type]) -> Doc
- pprFunArgType :: Type -> Doc
- split :: Type -> (Type, [Type])
- pprTyLit :: TyLit -> Doc
- pprCxt :: Cxt -> Doc
- ppr_cxt_preds :: Cxt -> Doc
- where_clause :: [Dec] -> Doc
- showtextl :: Show a => a -> Doc
- hashParens :: Doc -> Doc
- quoteParens :: Doc -> Doc
- commaSep :: Ppr a => [a] -> Doc
- commaSepWith :: (a -> Doc) -> [a] -> Doc
- semiSep :: Ppr a => [a] -> Doc
Documentation
type Precedence = Int
opPrec :: Precedence
noPrec :: Precedence
class Ppr a where
Minimal complete definition
Instances
pprPrefixOcc :: Name -> Doc
isSymbolASCII :: Char -> Bool
pprInfixExp :: Exp -> Doc
pprExp :: Precedence -> Exp -> Doc
pprMaybeExp :: Precedence -> Maybe Exp -> Doc
pprGuarded :: Doc -> (Guard, Exp) -> Doc
pprLit :: Precedence -> Lit -> Doc
bytesToString :: [Word8] -> String
pprPat :: Precedence -> Pat -> Doc
ppr_tf_head :: TypeFamilyHead -> Doc
commaSepApplied :: [Name] -> Doc
pprGadtRHS :: [(Strict, Type)] -> Type -> Doc
pprVarBangType :: VarBangType -> Doc
pprBangType :: BangType -> Doc
pprVarStrictType :: (Name, Strict, Type) -> Doc
Deprecated: As of template-haskell-2.11.0.0
, VarStrictType
has been replaced by VarBangType
. Please use pprVarBangType
instead.
pprStrictType :: (Strict, Type) -> Doc
Deprecated: As of template-haskell-2.11.0.0
, StrictType
has been replaced by BangType
. Please use pprBangType
instead.
pprParendType :: Type -> Doc
pprUInfixT :: Type -> Doc
pprFunArgType :: Type -> Doc
ppr_cxt_preds :: Cxt -> Doc
where_clause :: [Dec] -> Doc
hashParens :: Doc -> Doc
quoteParens :: Doc -> Doc
commaSepWith :: (a -> Doc) -> [a] -> Doc