language-c-0.9.2: Analysis and generation of C code
Copyright(c) [1995..1999] Manuel M. T. Chakravarty
(c) 2008 Benedikt Huber (stripped radically)
LicenseBSD-style
Maintainerbenedikt.huber@gmail.com
Stabilityexperimental
Portabilityghc
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.C.Data.Node

Description

source position and unqiue name

Synopsis

Documentation

data NodeInfo Source #

Parsed entity attribute

Instances

Instances details
Data NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NodeInfo -> c NodeInfo

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NodeInfo

toConstr :: NodeInfo -> Constr

dataTypeOf :: NodeInfo -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NodeInfo)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NodeInfo)

gmapT :: (forall b. Data b => b -> b) -> NodeInfo -> NodeInfo

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NodeInfo -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NodeInfo -> r

gmapQ :: (forall d. Data d => d -> u) -> NodeInfo -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> NodeInfo -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NodeInfo -> m NodeInfo

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NodeInfo -> m NodeInfo

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NodeInfo -> m NodeInfo

Generic NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Associated Types

type Rep NodeInfo :: Type -> Type

Methods

from :: NodeInfo -> Rep NodeInfo x

to :: Rep NodeInfo x -> NodeInfo

Show NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Methods

showsPrec :: Int -> NodeInfo -> ShowS

show :: NodeInfo -> String

showList :: [NodeInfo] -> ShowS

NFData NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Methods

rnf :: NodeInfo -> ()

Eq NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Methods

(==) :: NodeInfo -> NodeInfo -> Bool

(/=) :: NodeInfo -> NodeInfo -> Bool

Ord NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Methods

compare :: NodeInfo -> NodeInfo -> Ordering

(<) :: NodeInfo -> NodeInfo -> Bool

(<=) :: NodeInfo -> NodeInfo -> Bool

(>) :: NodeInfo -> NodeInfo -> Bool

(>=) :: NodeInfo -> NodeInfo -> Bool

max :: NodeInfo -> NodeInfo -> NodeInfo

min :: NodeInfo -> NodeInfo -> NodeInfo

CNode NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Pos NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

Pretty CAlignSpec Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CAlignSpec -> Doc Source #

prettyPrec :: Int -> CAlignSpec -> Doc Source #

Pretty CArrSize Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CArrSize -> Doc Source #

prettyPrec :: Int -> CArrSize -> Doc Source #

Pretty CAsmOperand Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CAsmOperand -> Doc Source #

prettyPrec :: Int -> CAsmOperand -> Doc Source #

Pretty CAsmStmt Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CAsmStmt -> Doc Source #

prettyPrec :: Int -> CAsmStmt -> Doc Source #

Pretty CAttr Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CAttr -> Doc Source #

prettyPrec :: Int -> CAttr -> Doc Source #

Pretty CBlockItem Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CBlockItem -> Doc Source #

prettyPrec :: Int -> CBlockItem -> Doc Source #

Pretty CBuiltin Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CBuiltin -> Doc Source #

prettyPrec :: Int -> CBuiltin -> Doc Source #

Pretty CConst Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CConst -> Doc Source #

prettyPrec :: Int -> CConst -> Doc Source #

Pretty CDecl Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CDecl -> Doc Source #

prettyPrec :: Int -> CDecl -> Doc Source #

Pretty CDeclSpec Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CDeclSpec -> Doc Source #

prettyPrec :: Int -> CDeclSpec -> Doc Source #

Pretty CDeclr Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CDeclr -> Doc Source #

prettyPrec :: Int -> CDeclr -> Doc Source #

Pretty CDesignator Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CDesignator -> Doc Source #

prettyPrec :: Int -> CDesignator -> Doc Source #

Pretty CEnum Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CEnum -> Doc Source #

prettyPrec :: Int -> CEnum -> Doc Source #

Pretty CExpr Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CExpr -> Doc Source #

prettyPrec :: Int -> CExpr -> Doc Source #

Pretty CExtDecl Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CExtDecl -> Doc Source #

prettyPrec :: Int -> CExtDecl -> Doc Source #

Pretty CFunDef Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CFunDef -> Doc Source #

prettyPrec :: Int -> CFunDef -> Doc Source #

Pretty CFunSpec Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CFunSpec -> Doc Source #

prettyPrec :: Int -> CFunSpec -> Doc Source #

Pretty CInit Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CInit -> Doc Source #

prettyPrec :: Int -> CInit -> Doc Source #

Pretty CStat Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CStat -> Doc Source #

prettyPrec :: Int -> CStat -> Doc Source #

Pretty CStorageSpec Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CStorageSpec -> Doc Source #

prettyPrec :: Int -> CStorageSpec -> Doc Source #

Pretty CStrLit Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CStrLit -> Doc Source #

prettyPrec :: Int -> CStrLit -> Doc Source #

Pretty CStructUnion Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CStructUnion -> Doc Source #

prettyPrec :: Int -> CStructUnion -> Doc Source #

Pretty CTranslUnit Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CTranslUnit -> Doc Source #

prettyPrec :: Int -> CTranslUnit -> Doc Source #

Pretty CTypeQual Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CTypeQual -> Doc Source #

prettyPrec :: Int -> CTypeQual -> Doc Source #

Pretty CTypeSpec Source # 
Instance details

Defined in Language.C.Pretty

Methods

pretty :: CTypeSpec -> Doc Source #

prettyPrec :: Int -> CTypeSpec -> Doc Source #

type Rep NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

type Rep NodeInfo = D1 ('MetaData "NodeInfo" "Language.C.Data.Node" "language-c-0.9.2-2qlksbsQow9Gzp8WTwI6fa" 'False) (C1 ('MetaCons "OnlyPos" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 PosLength)) :+: C1 ('MetaCons "NodeInfo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 PosLength) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Name))))

undefNode :: NodeInfo Source #

create a node with neither name nor positional information

isUndefNode :: NodeInfo -> Bool Source #

return True if the node carries neither name nor positional information

mkNodeInfoOnlyPos :: Position -> NodeInfo Source #

| Given only a source position, create a new node attribute

mkNodeInfoPosLen :: Position -> PosLength -> NodeInfo Source #

Given a source position and the position and length of the last token, create a new node attribute

mkNodeInfo :: Position -> Name -> NodeInfo Source #

Given a source position and a unique name, create a new attribute identifier

mkNodeInfo' :: Position -> PosLength -> Name -> NodeInfo Source #

Given a source position, the position and length of the last token and a unique name, create a new attribute identifier. Strict in

internalNode :: NodeInfo Source #

Deprecated: use undefNode instead

class CNode a where Source #

a class for convenient access to the attributes of an attributed object

Methods

nodeInfo :: a -> NodeInfo Source #

Instances

Instances details
CNode TagFwdDecl Source # 
Instance details

Defined in Language.C.Analysis.DefTable

CNode Attr Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode CompType Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode CompTypeRef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode Decl Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode DeclEvent Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode EnumType Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode EnumTypeRef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode Enumerator Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode FunDef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode IdentDecl Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode MemberDecl Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode ObjDef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode ParamDecl Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode TagDef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode TypeDef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode TypeDefRef Source # 
Instance details

Defined in Language.C.Analysis.SemRep

CNode Ident Source # 
Instance details

Defined in Language.C.Data.Ident

CNode NodeInfo Source # 
Instance details

Defined in Language.C.Data.Node

CNode t1 => CNode (CAlignmentSpecifier t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CAssemblyOperand t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CAssemblyStatement t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CAttribute t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CBuiltinThing t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CCompoundBlockItem t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CConstant t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CDeclaration t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CDeclarationSpecifier t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CDeclarator t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CDerivedDeclarator t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CEnumeration t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CExpression t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CExternalDeclaration t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CFunctionDef t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CFunctionSpecifier t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CInitializer t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CPartDesignator t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CStatement t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CStorageSpecifier t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CStringLiteral t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CStructureUnion t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CTranslationUnit t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CTypeQualifier t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

CNode t1 => CNode (CTypeSpecifier t1) Source # 
Instance details

Defined in Language.C.Syntax.AST

(CNode a, CNode b) => CNode (Either a b) Source # 
Instance details

Defined in Language.C.Data.Node

Methods

nodeInfo :: Either a b -> NodeInfo Source #

fileOfNode :: CNode a => a -> Maybe FilePath Source #

getLastTokenPos :: NodeInfo -> PosLength Source #

get the position and length of the last token

lengthOfNode :: NodeInfo -> Maybe Int Source #

get the number of characters an AST node spans

eqByName :: CNode a => a -> a -> Bool Source #

equality by name