language-c-quote-0.12.2.1: C/CUDA/OpenCL/Objective-C quasiquoting library.

Copyright(c) 2006-2011 Harvard University
(c) 2011-2013 Geoffrey Mainland
: (c) 2013-2016 Drexel University
LicenseBSD-style
Maintainermainland@drexel.edu
Safe HaskellNone
LanguageHaskell98

Language.C.Pretty

Contents

Description

 
Synopsis

Documentation

data Fixity Source #

Constructors

Fixity Assoc Int 
Instances
Eq Fixity Source # 
Instance details

Defined in Language.C.Pretty

Methods

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

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

Ord Fixity Source # 
Instance details

Defined in Language.C.Pretty

data Assoc Source #

Constructors

LeftAssoc 
RightAssoc 
NonAssoc 
Instances
Eq Assoc Source # 
Instance details

Defined in Language.C.Pretty

Methods

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

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

Ord Assoc Source # 
Instance details

Defined in Language.C.Pretty

Methods

compare :: Assoc -> Assoc -> Ordering #

(<) :: Assoc -> Assoc -> Bool #

(<=) :: Assoc -> Assoc -> Bool #

(>) :: Assoc -> Assoc -> Bool #

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

max :: Assoc -> Assoc -> Assoc #

min :: Assoc -> Assoc -> Assoc #

infixop Source #

Arguments

:: (Pretty a, Pretty b, Pretty op, CFixity op) 
=> Int

precedence of context

-> op

operator

-> a

left argument

-> b

right argument

-> Doc 

Pretty print infix binary operators

prefixop Source #

Arguments

:: (Pretty a, Pretty op, CFixity op) 
=> Int

precedence of context

-> op

operator

-> a

argument

-> Doc 

Pretty print prefix unary operators

class CFixity a where Source #

Minimal complete definition

fixity

Methods

fixity :: a -> Fixity Source #

parensOp :: Int -> a -> Doc -> Doc Source #

Instances
CFixity UnOp Source # 
Instance details

Defined in Language.C.Pretty

Methods

fixity :: UnOp -> Fixity Source #

parensOp :: Int -> UnOp -> Doc -> Doc Source #

CFixity AssignOp Source # 
Instance details

Defined in Language.C.Pretty

CFixity BinOp Source # 
Instance details

Defined in Language.C.Pretty

pprEnum :: Maybe Id -> [CEnum] -> [Attr] -> Doc Source #

Orphan instances

Pretty CaptureListEntry Source # 
Instance details

Pretty LambdaDeclarator Source # 
Instance details

Pretty LambdaIntroducer Source # 
Instance details

Pretty ObjCRecv Source # 
Instance details

Methods

ppr :: ObjCRecv -> Doc #

pprPrec :: Int -> ObjCRecv -> Doc #

pprList :: [ObjCRecv] -> Doc #

Pretty ObjCDictElem Source # 
Instance details

Pretty ObjCCatch Source # 
Instance details

Methods

ppr :: ObjCCatch -> Doc #

pprPrec :: Int -> ObjCCatch -> Doc #

pprList :: [ObjCCatch] -> Doc #

Pretty ObjCMethodProto Source # 
Instance details

Pretty ObjCParam Source # 
Instance details

Methods

ppr :: ObjCParam -> Doc #

pprPrec :: Int -> ObjCParam -> Doc #

pprList :: [ObjCParam] -> Doc #

Pretty ObjCMethodReq Source # 
Instance details

Pretty ObjCPropAttr Source # 
Instance details

Pretty ObjCIfaceDecl Source # 
Instance details

Pretty ObjCVisibilitySpec Source # 
Instance details

Pretty ObjCIvarDecl Source # 
Instance details

Pretty BlockType Source # 
Instance details

Methods

ppr :: BlockType -> Doc #

pprPrec :: Int -> BlockType -> Doc #

pprList :: [BlockType] -> Doc #

Pretty AsmIn Source # 
Instance details

Methods

ppr :: AsmIn -> Doc #

pprPrec :: Int -> AsmIn -> Doc #

pprList :: [AsmIn] -> Doc #

Pretty AsmOut Source # 
Instance details

Methods

ppr :: AsmOut -> Doc #

pprPrec :: Int -> AsmOut -> Doc #

pprList :: [AsmOut] -> Doc #

Pretty UnOp Source # 
Instance details

Methods

ppr :: UnOp -> Doc #

pprPrec :: Int -> UnOp -> Doc #

pprList :: [UnOp] -> Doc #

Pretty AssignOp Source # 
Instance details

Methods

ppr :: AssignOp -> Doc #

pprPrec :: Int -> AssignOp -> Doc #

pprList :: [AssignOp] -> Doc #

Pretty BinOp Source # 
Instance details

Methods

ppr :: BinOp -> Doc #

pprPrec :: Int -> BinOp -> Doc #

pprList :: [BinOp] -> Doc #

Pretty Exp Source # 
Instance details

Methods

ppr :: Exp -> Doc #

pprPrec :: Int -> Exp -> Doc #

pprList :: [Exp] -> Doc #

Pretty Const Source # 
Instance details

Methods

ppr :: Const -> Doc #

pprPrec :: Int -> Const -> Doc #

pprList :: [Const] -> Doc #

Pretty BlockItem Source # 
Instance details

Methods

ppr :: BlockItem -> Doc #

pprPrec :: Int -> BlockItem -> Doc #

pprList :: [BlockItem] -> Doc #

Pretty Stm Source # 
Instance details

Methods

ppr :: Stm -> Doc #

pprPrec :: Int -> Stm -> Doc #

pprList :: [Stm] -> Doc #

Pretty Definition Source # 
Instance details

Pretty Func Source # 
Instance details

Methods

ppr :: Func -> Doc #

pprPrec :: Int -> Func -> Doc #

pprList :: [Func] -> Doc #

Pretty Params Source # 
Instance details

Methods

ppr :: Params -> Doc #

pprPrec :: Int -> Params -> Doc #

pprList :: [Params] -> Doc #

Pretty Param Source # 
Instance details

Methods

ppr :: Param -> Doc #

pprPrec :: Int -> Param -> Doc #

pprList :: [Param] -> Doc #

Pretty Attr Source # 
Instance details

Methods

ppr :: Attr -> Doc #

pprPrec :: Int -> Attr -> Doc #

pprList :: [Attr] -> Doc #

Pretty CEnum Source # 
Instance details

Methods

ppr :: CEnum -> Doc #

pprPrec :: Int -> CEnum -> Doc #

pprList :: [CEnum] -> Doc #

Pretty FieldGroup Source # 
Instance details

Pretty Field Source # 
Instance details

Methods

ppr :: Field -> Doc #

pprPrec :: Int -> Field -> Doc #

pprList :: [Field] -> Doc #

Pretty InitGroup Source # 
Instance details

Methods

ppr :: InitGroup -> Doc #

pprPrec :: Int -> InitGroup -> Doc #

pprList :: [InitGroup] -> Doc #

Pretty Typedef Source # 
Instance details

Methods

ppr :: Typedef -> Doc #

pprPrec :: Int -> Typedef -> Doc #

pprList :: [Typedef] -> Doc #

Pretty Init Source # 
Instance details

Methods

ppr :: Init -> Doc #

pprPrec :: Int -> Init -> Doc #

pprList :: [Init] -> Doc #

Pretty Initializer Source # 
Instance details

Pretty Designation Source # 
Instance details

Pretty Designator Source # 
Instance details

Pretty Type Source # 
Instance details

Methods

ppr :: Type -> Doc #

pprPrec :: Int -> Type -> Doc #

pprList :: [Type] -> Doc #

Pretty ArraySize Source # 
Instance details

Methods

ppr :: ArraySize -> Doc #

pprPrec :: Int -> ArraySize -> Doc #

pprList :: [ArraySize] -> Doc #

Pretty DeclSpec Source # 
Instance details

Methods

ppr :: DeclSpec -> Doc #

pprPrec :: Int -> DeclSpec -> Doc #

pprList :: [DeclSpec] -> Doc #

Pretty TypeSpec Source # 
Instance details

Methods

ppr :: TypeSpec -> Doc #

pprPrec :: Int -> TypeSpec -> Doc #

pprList :: [TypeSpec] -> Doc #

Pretty Sign Source # 
Instance details

Methods

ppr :: Sign -> Doc #

pprPrec :: Int -> Sign -> Doc #

pprList :: [Sign] -> Doc #

Pretty TypeQual Source # 
Instance details

Methods

ppr :: TypeQual -> Doc #

pprPrec :: Int -> TypeQual -> Doc #

pprList :: [TypeQual] -> Doc #

Pretty Storage Source # 
Instance details

Methods

ppr :: Storage -> Doc #

pprPrec :: Int -> Storage -> Doc #

pprList :: [Storage] -> Doc #

Pretty StringLit Source # 
Instance details

Methods

ppr :: StringLit -> Doc #

pprPrec :: Int -> StringLit -> Doc #

pprList :: [StringLit] -> Doc #

Pretty Id Source # 
Instance details

Methods

ppr :: Id -> Doc #

pprPrec :: Int -> Id -> Doc #

pprList :: [Id] -> Doc #