Modifier and Type | Method and Description |
---|---|
AstNode |
AstNode.findFirstChild(AstNodeType... nodeTypes)
Find the first child among all children and grand-children having one of the requested types.
|
AstNode |
AstNode.findFirstDirectChild(AstNodeType... nodeTypes)
Find the first child among all direct children having one of the requested types.
|
AstNode |
AstNode.findFirstParent(AstNodeType nodeType)
Find the first parent with the desired node type
|
abstract AstNode |
PreprocessingDirective.getAst() |
AstNode |
AstNode.getChild(int index)
Get the desired child
|
AstNode |
AstNode.getFirstChild()
Get the first child of this node
|
AstNode |
AstNode.getLastChild()
Get the last child of this node
|
AstNode |
AstNode.getParent()
Get the parent of this node in the tree.
|
AstNode |
AstNodeBrowser.getResult() |
AstNode |
AstNode.nextAstNode()
Get the next sibling AstNode in the tree and if this node doesn't exist try to get the next AST Node of the parent.
|
AstNode |
AstNode.nextSibling()
Get the next sibling AstNode if exists in the tree.
|
AstNode |
AstNode.previousAstNode()
Get the previous sibling AstNode in the tree and if this node doesn't exist try to get the next AST Node of the parent.
|
AstNode |
AstNode.previousSibling()
Get the previous sibling AstNode if exists in the tree.
|
Modifier and Type | Method and Description |
---|---|
java.util.List<AstNode> |
AstNode.findChildren(AstNodeType... nodeTypes)
Find the all children having the requested type(s).
|
java.util.List<AstNode> |
AstNode.findDirectChildren(AstNodeType... nodeTypes)
Find the all children among direct children having the requested type(s).
|
java.util.List<AstNode> |
AstNode.getChildren()
Get the list of children.
|
java.util.List<AstNode> |
AstNodeBrowser.getResults() |
Modifier and Type | Method and Description |
---|---|
void |
AstNode.addChild(AstNode child) |
static AstNodeBrowser |
AstNodeBrowser.browse(AstNode rootNode) |
static PreprocessingDirective |
PreprocessingDirective.create(AstNode ast,
Grammar grammar) |
static Trivia |
Trivia.createPreprocessingDirective(AstNode ast,
Grammar grammar) |
boolean |
GenericTokenType.hasToBeSkippedFromAst(AstNode node) |
boolean |
AstNodeSkippingPolicy.hasToBeSkippedFromAst(AstNode node)
Some AstNode can be pretty useless and makes a global AST less readable.
|
boolean |
TokenType.hasToBeSkippedFromAst(AstNode node) |
void |
AstVisitor.leaveFile(AstNode ast)
Called once a computation unit tree has been fully visited.
|
void |
AstVisitor.leaveNode(AstNode ast)
Called once an AST node has been fully visited.
|
void |
AstVisitor.visitFile(AstNode ast)
Called before starting visiting a computation unit tree.
|
void |
AstVisitor.visitNode(AstNode ast)
Called to process an AST node whose type has been registered to be visited.
|
Constructor and Description |
---|
AstNodeBrowser(AstNode rootNode) |
Modifier and Type | Method and Description |
---|---|
AstNode |
Statement.getAstNode() |
AstNode |
Branch.getCondition() |
Modifier and Type | Method and Description |
---|---|
void |
ExecutionFlowEngine.callVisitBranchOnVisitors(Statement conditionalStatement,
AstNode condition) |
Statement |
ExecutionFlowEngine.getStatement(AstNode stmtNode) |
void |
Branch.setCondition(AstNode condition) |
void |
ExecutionFlowEngine.visitFlow(AstNode stmtToStartVisitFrom,
ExecutionFlowVisitor... visitors) |
void |
ExecutionFlow.visitFlow(AstNode stmtToStartVisitFrom,
ExecutionFlowVisitor<STATEMENT>... visitors) |
Constructor and Description |
---|
Statement(AstNode stmtAstNode) |
Modifier and Type | Method and Description |
---|---|
AstNode |
Symbol.getAstNode() |
Constructor and Description |
---|
Symbol(AstNode node) |
Modifier and Type | Method and Description |
---|---|
AstNode |
ParsingState.getMemoizedAst(MemoizedMatcher matcher) |
AstNode |
Parser.parse(java.io.File file) |
AstNode |
Parser2.parse(java.io.File file) |
AstNode |
Parser.parse(java.util.List<Token> tokens) |
AstNode |
Parser2.parse(java.util.List<Token> tokens) |
AstNode |
Parser.parse(java.lang.String source) |
AstNode |
Parser2.parse(java.lang.String source) |
Modifier and Type | Method and Description |
---|---|
void |
ParsingState.memoizeAst(MemoizedMatcher matcher,
AstNode astNode) |
Modifier and Type | Method and Description |
---|---|
AstNode |
LeftAssociative.OperatorAndOperand.getOperand() |
Modifier and Type | Method and Description |
---|---|
boolean |
SkipFromAstIfOnlyOneChild.hasToBeSkippedFromAst(AstNode node) |
boolean |
NeverSkipFromAst.hasToBeSkippedFromAst(AstNode node) |
boolean |
AlwaysSkipFromAst.hasToBeSkippedFromAst(AstNode node) |
static java.lang.String |
AstXmlPrinter.print(AstNode rootNode) |
static void |
AstXmlPrinter.print(AstNode rootNode,
java.io.Writer writer) |
void |
AstWalker.walkAndVisit(AstNode ast) |
void |
AstWalker.walkVisitAndListen(AstNode ast,
java.lang.Object output) |
Constructor and Description |
---|
LeftAssociative.Iterator(AstNode leftAssociativeNode) |
LeftAssociative.OperatorAndOperand(AstNodeType operator,
AstNode operand) |
Modifier and Type | Method and Description |
---|---|
void |
ParsingEventListener.exitWithMatchMatcher(Matcher matcher,
ParsingState parsingState,
AstNode astNode) |
void |
AutoCompleter.exitWithMatchMatcher(Matcher matcher,
ParsingState parsingState,
AstNode astNode) |
void |
ExtendedStackTrace.exitWithMatchMatcher(Matcher matcher,
ParsingState parsingState,
AstNode astNode) |
void |
ParsingEventListener.exitWithMatchRule(RuleMatcher rule,
ParsingState parsingState,
AstNode astNode) |
void |
ExtendedStackTrace.exitWithMatchRule(RuleMatcher rule,
ParsingState parsingState,
AstNode astNode) |
Modifier and Type | Method and Description |
---|---|
AstNode |
Matcher.MatchResult.getAstNode() |
protected AstNode |
MemoizedMatcher.getMemoizedAst(ParsingState parsingState) |
abstract AstNode |
Matcher.match(ParsingState parsingState) |
AstNode |
MemoizedMatcher.match(ParsingState parsingState) |
AstNode |
StandardMatcher.match(ParsingState parsingState) |
protected AstNode |
InclusiveTillMatcher.matchWorker(ParsingState parsingState) |
protected AstNode |
ExclusiveTillMatcher.matchWorker(ParsingState parsingState) |
protected AstNode |
LongestOneMatcher.matchWorker(ParsingState parsingState) |
protected AstNode |
TillNewLineMatcher.matchWorker(ParsingState parsingState) |
protected abstract AstNode |
MemoizedMatcher.matchWorker(ParsingState parsingState) |
protected AstNode |
BridgeMatcher.matchWorker(ParsingState parsingState) |
protected AstNode |
StandardMatcher.matchWorker(ParsingState parsingState) |
Modifier and Type | Method and Description |
---|---|
protected void |
Matcher.exitWithMatchEvent(ParsingState parsingState,
AstNode astNode) |
boolean |
RuleDefinition.hasToBeSkippedFromAst(AstNode node) |
protected void |
MemoizedMatcher.memoizeAst(ParsingState parsingState,
AstNode astNode) |
protected static Matcher.MatchResult |
Matcher.MatchResult.succeed(ParsingState parsingState,
int startingIndex,
AstNode astNode) |
Modifier and Type | Method and Description |
---|---|
boolean |
CICSKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
CobolKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
GcosKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
SQLKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
DliKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
AcuCobolTokenType.hasToBeSkippedFromAst(AstNode node) |
boolean |
MicrofocusKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
HpKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
AcuCobolKeyword.hasToBeSkippedFromAst(AstNode node) |
boolean |
CobolTokenType.hasToBeSkippedFromAst(AstNode node) |
boolean |
CobolSpecialCharacter.hasToBeSkippedFromAst(AstNode node) |
Modifier and Type | Method and Description |
---|---|
void |
CobolAstVisitor.leaveFile(AstNode astNode)
Called once a computation unit tree has been fully visited.
|
void |
CobolAstVisitor.leaveNode(AstNode astNode)
Called once an AST node has been fully visited.
|
protected void |
CobolAstCheck.log(java.lang.String messageText,
AstNode node,
java.lang.Object... messageParameters)
Log a violation on an AstNode
|
void |
CobolAstVisitor.visitFile(AstNode astNode)
Called before starting visiting a computation unit tree.
|
void |
CobolAstVisitor.visitNode(AstNode astNode)
Called to process an AST node whose type has been registered to be visited.
|
Modifier and Type | Method and Description |
---|---|
protected void |
CobolStatement.setOutputDataItem(AstNode qualifiedDataNameNode) |
Modifier and Type | Method and Description |
---|---|
protected void |
CobolStatement.setInputDataItems(java.util.List<AstNode> qualifiedDataNameNodes) |
protected void |
CobolStatement.setOutputDataItems(java.util.List<AstNode> qualifiedDataNameNodes) |
Constructor and Description |
---|
CobolStatement(AstNode stmtAstNode,
CobolGrammar grammar,
CobolSymbolTable symbolTable) |
Modifier and Type | Method and Description |
---|---|
java.util.List<AstNode> |
Module.getCalls() |
Modifier and Type | Method and Description |
---|---|
static DataItem |
DataItemFinder.find(CobolGrammar grammar,
CobolSymbolTable symbolTable,
AstNode qualifiedDataNameNode) |
Modifier and Type | Method and Description |
---|---|
void |
Module.addCalls(java.util.List<AstNode> calls) |
Constructor and Description |
---|
DataItem(AstNode node) |
FileSymbol(java.lang.String name,
AstNode node) |
Module(Procedure startProcedure,
AstNode call) |
Module(Procedure startProcedure,
Procedure endProcedure,
AstNode call) |
Paragraph(java.lang.String name,
AstNode node) |
Procedure(java.lang.String name,
AstNode node) |
Section(java.lang.String name,
AstNode node) |
Modifier and Type | Method and Description |
---|---|
static AstNode |
AstCreator.create(java.net.URI uri,
ParsingResult parsingResult) |
Modifier and Type | Method and Description |
---|---|
boolean |
GrammarElementMatcher.hasToBeSkippedFromAst(AstNode node) |
Modifier and Type | Method and Description |
---|---|
AstNode |
ParserAdapter.parse(java.io.File file) |
AstNode |
ParserAdapter.parse(java.util.List<Token> tokens) |
AstNode |
ParserAdapter.parse(java.lang.String source) |
Copyright © 2012 SonarSource. All Rights Reserved.