- abbreviationRest - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- acceptAnsi - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptBeforeTimePhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptEnvironment - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptEvent - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptFieldOrScreenOrControlStatement - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptFrom - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptMessagesFromThreadPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptScreen - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acceptStatement - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- acceptUntilPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- accessModeClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- activeXControl - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- acu - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- AcuCobolExtension - Class in com.sonarsource.cobol.api
-
- AcuCobolExtension() - Constructor for class com.sonarsource.cobol.api.AcuCobolExtension
-
- AcuCobolKeyword - Enum in com.sonarsource.cobol.api
-
- AcuCobolTokenType - Enum in com.sonarsource.cobol.api
-
- add(Statement) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- add(FlowHandler) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine.FunctionCallStack
-
- addAllTokens(List<Token>) - Method in class com.sonar.sslr.api.LexerOutput
-
Add a list of tokens to the list without notifying preprocessors.
- addAllTrivia(List<Trivia>) - Method in class com.sonar.sslr.api.Token
-
FIXME no such method in SSLR 1.9
- addCalls(List<AstNode>) - Method in class com.sonarsource.cobol.api.symbol.Module
-
- addChild(AstNode) - Method in class com.sonar.sslr.api.AstNode
-
- addChild(DataItem) - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- addDataItem(DataItem) - Method in class com.sonarsource.cobol.api.symbol.CobolSymbolTable
-
- addFile(FileSymbol) - Method in class com.sonarsource.cobol.api.symbol.CobolSymbolTable
-
- addListener(RecognitionExceptionListener) - Method in class com.sonar.sslr.impl.Parser
-
- addListener(RecognitionExceptionListener) - Method in class com.sonar.sslr.impl.Parser2
-
- addListeners(RecognitionExceptionListener...) - Method in class com.sonar.sslr.impl.ParsingState
-
- addModule(Module) - Method in class com.sonarsource.cobol.api.symbol.CobolSymbolTable
-
- addParsingEventListeners(ParsingEventListener...) - Method in class com.sonar.sslr.impl.Parser.Builder
-
- addParsingEventListeners(ParsingEventListener...) - Method in class com.sonar.sslr.impl.Parser2.ParserBuilder
-
- addRecognictionExceptionListeners(RecognitionExceptionListener...) - Method in class com.sonar.sslr.impl.Parser.Builder
-
- addRecognictionExceptionListeners(RecognitionExceptionListener...) - Method in class com.sonar.sslr.impl.Parser2.ParserBuilder
-
- addSourceCode(SourceCode) - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
Do not use
- addStatement - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- addToken(Token) - Method in class com.sonar.sslr.api.LexerOutput
-
Add a token to the list without notifying preprocessors.
- addToken(Token...) - Method in class com.sonar.sslr.impl.Lexer
-
- addTokenAndProcess(TokenType, String, int, int) - Method in class com.sonar.sslr.api.LexerOutput
-
Add a new token and notify the preprocessors
- addTokenAndProcess(TokenType, String, String, int, int) - Method in class com.sonar.sslr.api.LexerOutput
-
Add a new token and notify the preprocessors
- addTrivia(Trivia) - Method in class com.sonar.sslr.api.LexerOutput
-
- addTrivia(Trivia) - Method in class com.sonar.sslr.api.Token.Builder
-
- addTrivia(Trivia...) - Method in class com.sonar.sslr.impl.Lexer
-
- addTrivia(List<Trivia>) - Method in class com.sonar.sslr.impl.Lexer
-
- addVisitor(AstVisitor) - Method in class com.sonar.sslr.impl.ast.AstWalker
-
- adjacent(Object) - Static method in class com.sonar.sslr.impl.matcher.GrammarFunctions.Advanced
-
Match the element if and only if the first token of this element is adjacent to the previous consumed token.
- AdjacentMatcher - Class in com.sonar.sslr.impl.matcher
-
This class is not intended to be instantiated or sub-classed by clients.
- AdjacentMatcher(Matcher) - Constructor for class com.sonar.sslr.impl.matcher.AdjacentMatcher
-
- advanceIndex(int) - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- advancingPhrase - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- aggregateIfThereIsAlreadyAValue() - Method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
- alphabetClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- alphabetName - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- alteredGoto - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- alternateRecordKeyClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- alterStatement - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- AlwaysSkipFromAst - Class in com.sonar.sslr.impl.ast
-
- AlwaysSkipFromAst() - Constructor for class com.sonar.sslr.impl.ast.AlwaysSkipFromAst
-
- and(String...) - Static method in class com.sonar.sslr.impl.channel.RegexpChannelBuilder
-
- and(Object...) - Static method in class com.sonar.sslr.impl.matcher.GrammarFunctions.Standard
-
Match all elements in a sequential order.
- and(Object...) - Static method in class org.sonar.sslr.parser.GrammarFunctionsMigrator
-
- AndMatcher - Class in com.sonar.sslr.impl.matcher
-
A
Matcher
that tries all of its submatchers in sequence and only succeeds if all submatchers succeed.
- AndMatcher(Matcher...) - Constructor for class com.sonar.sslr.impl.matcher.AndMatcher
-
- ANY_CHAR - Static variable in class com.sonar.sslr.impl.channel.RegexpChannelBuilder
-
- anyButNot(String...) - Static method in class com.sonar.sslr.impl.channel.RegexpChannelBuilder
-
- anyToken() - Static method in class com.sonar.sslr.impl.matcher.GrammarFunctions.Advanced
-
Consume the next token whatever it is
- anyTokenButNot(Object) - Static method in class com.sonar.sslr.impl.matcher.GrammarFunctions.Advanced
-
Consume the next token if and only if the element doesn't match
- AnyTokenButNotMatcher - Class in com.sonar.sslr.impl.matcher
-
This class is not intended to be instantiated or sub-classed by clients.
- AnyTokenButNotMatcher(Matcher) - Constructor for class com.sonar.sslr.impl.matcher.AnyTokenButNotMatcher
-
- AnyTokenMatcher - Class in com.sonar.sslr.impl.matcher
-
This class is not intended to be instantiated or sub-classed by clients.
- AnyTokenMatcher() - Constructor for class com.sonar.sslr.impl.matcher.AnyTokenMatcher
-
- applyIoClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- arithmeticExpression - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- assignClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- assignStatement - Variable in class com.sonarsource.cobol.api.GcosExtension
-
- AstAndTokenVisitor - Interface in com.sonar.sslr.api
-
The AstVisitor allows to visit some desired AstNode.
- AstCreator - Class in org.sonar.sslr.internal.matchers
-
- AstNode - Class in com.sonar.sslr.api
-
the parser is in charge to construct an abstract syntax tree (AST) which is a tree representation of the abstract syntactic structure of
source code.
- AstNode(Token) - Constructor for class com.sonar.sslr.api.AstNode
-
- AstNode(AstNodeType, String, Token) - Constructor for class com.sonar.sslr.api.AstNode
-
- AstNodeBrowser - Class in com.sonar.sslr.api
-
- AstNodeBrowser(AstNode) - Constructor for class com.sonar.sslr.api.AstNodeBrowser
-
- AstNodeSkippingPolicy - Interface in com.sonar.sslr.api
-
Specific Ast node types that can tell whether they should be skipped from being attached to the AST or not.
- AstNodeType - Interface in com.sonar.sslr.api
-
Each AST Node has a type which can be for instance the Rule of a Grammar, a language keyword or a language special token like a WORD.
- AstVisitor - Interface in com.sonar.sslr.api
-
- AstWalker - Class in com.sonar.sslr.impl.ast
-
- AstWalker(AstVisitor...) - Constructor for class com.sonar.sslr.impl.ast.AstWalker
-
- AstWalker(List<? extends AstVisitor>) - Constructor for class com.sonar.sslr.impl.ast.AstWalker
-
- AstXmlPrinter - Class in com.sonar.sslr.impl.ast
-
- atScreenClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- AuditListener - Interface in com.sonar.sslr.api
-
An AuditListener must be used to be notified of parsing error or standard exception which might occur when analysing a source code
- authorParagraph - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- autoComplete(Matcher) - Method in class com.sonar.sslr.impl.events.AutoCompleter
-
- autoComplete(Matcher, int) - Method in class com.sonar.sslr.impl.events.AutoCompleter
-
- autoComplete(Matcher, List<Token>) - Method in class com.sonar.sslr.impl.events.AutoCompleter
-
- autoComplete(Matcher, List<Token>, int) - Method in class com.sonar.sslr.impl.events.AutoCompleter
-
- AutoCompleter - Class in com.sonar.sslr.impl.events
-
- AutoCompleter() - Constructor for class com.sonar.sslr.impl.events.AutoCompleter
-
- autoPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- autoScreenClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- g(String...) - Static method in class com.sonar.sslr.impl.channel.RegexpChannelBuilder
-
- gcos - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- GcosExtension - Class in com.sonarsource.cobol.api
-
- GcosExtension() - Constructor for class com.sonarsource.cobol.api.GcosExtension
-
- GcosKeyword - Enum in com.sonarsource.cobol.api
-
- generate(ParsingState) - Static method in class com.sonar.sslr.impl.ParsingStackTrace
-
- generateFullStackTrace(ParsingState) - Static method in class com.sonar.sslr.impl.ParsingStackTrace
-
- generateStatement - Variable in class com.sonarsource.cobol.api.GcosExtension
-
- GenericTokenType - Enum in com.sonar.sslr.api
-
- get(int) - Method in class com.sonar.sslr.api.LexerOutput
-
- getAggregationFormula() - Method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
- getAllCheckClasses(CobolAstCheckRepository...) - Static method in class com.sonarsource.cobol.api.ast.CobolAstCheckRepository
-
- getAllChecks(CobolAstCheckRepository...) - Static method in class com.sonarsource.cobol.api.ast.CobolAstCheckRepository
-
- getAllRuleFields(Class) - Static method in class com.sonar.sslr.api.Grammar
-
Find all direct and indirect rule fields declared in the given Grammar class.
- getArray(CobolGrammar) - Static method in class com.sonarsource.cobol.api.ast.ComplexityNodesRepository
-
- getArraySize() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getAssignment() - Method in class com.sonarsource.cobol.api.symbol.FileSymbol
-
- getAst() - Method in class com.sonar.sslr.api.PreprocessingDirective
-
- getAstNode() - Method in class com.sonar.sslr.api.flow.Statement
-
- getAstNode() - Method in class com.sonar.sslr.api.symbol.Symbol
-
- getAstNode() - Method in class com.sonar.sslr.impl.matcher.Matcher.MatchResult
-
- getAstNodeTypesToVisit() - Method in interface com.sonar.sslr.api.AstVisitor
-
The AST node types that this check must be registered for.
- getAstNodeTypesToVisit() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
This method can't be overridden.
- getCalculatedMetricFormula() - Method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
- getCalls() - Method in class com.sonarsource.cobol.api.symbol.Module
-
- getChannelDispatcher() - Method in class com.sonar.sslr.impl.Lexer2
-
- getCharset() - Method in class com.sonar.sslr.impl.Lexer2
-
- getCheckClasses() - Method in class com.sonarsource.cobol.api.ast.CobolAstCheckRepository
-
Deprecated.
in 1.11 Override the getChecks() method instead
- getChecks() - Method in class com.sonarsource.cobol.api.ast.CobolAstCheckRepository
-
- getChild(int) - Method in class com.sonar.sslr.api.AstNode
-
Get the desired child
- getChild(int) - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getChildren() - Method in class com.sonar.sslr.api.AstNode
-
Get the list of children.
- getChildren() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getChildren() - Method in class org.sonar.sslr.internal.matchers.ParseNode
-
- getCicsGrammar() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getCobolGrammar() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getColumn() - Method in class com.sonar.sslr.api.Token
-
- getColumn() - Method in class org.sonar.sslr.internal.matchers.InputBuffer.Position
-
- getCommentAtLine(int) - Method in class com.sonar.sslr.api.Comments
-
- getComments() - Method in class com.sonar.sslr.api.LexerOutput
-
- getComments(CommentAnalyser) - Method in class com.sonar.sslr.api.LexerOutput
-
- getComments() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getCommentTokens() - Method in class com.sonar.sslr.api.LexerOutput
-
- getCommentTokensAtLine(int) - Method in class com.sonar.sslr.api.Comments
-
- getCondition() - Method in class com.sonar.sslr.api.flow.Branch
-
- getConditionalStatement() - Method in class com.sonar.sslr.api.flow.Branch
-
- getConfiguration() - Method in class com.sonar.sslr.impl.Lexer2
-
- getContents(String) - Method in class com.sonar.sslr.api.CommentAnalyser
-
Extract the content of a comment, i.e.
- getCopybookName() - Method in class com.sonarsource.cobol.api.ast.CobolCheckMessage
-
- getCopyBookOriginalFileName() - Method in class com.sonar.sslr.api.Token
-
- getCopyBookOriginalLine() - Method in class com.sonar.sslr.api.Token
-
- getCurrentIndex() - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- getDataName() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getDelegate() - Method in class com.sonar.sslr.impl.matcher.DelegatingMatcher
-
- getDepth() - Method in class com.sonar.sslr.api.flow.Branch
-
- getDepthDetail() - Method in class com.sonar.sslr.api.flow.Branch
-
- getEndIndex() - Method in class org.sonar.sslr.internal.matchers.MatcherPathElement
-
- getEndIndex() - Method in class org.sonar.sslr.internal.matchers.ParseNode
-
- getEndLine() - Method in class com.sonar.sslr.api.symbol.Symbol
-
- getEndLine() - Method in class com.sonarsource.cobol.api.symbol.Module
-
- getEndProcedure() - Method in class com.sonarsource.cobol.api.symbol.Module
-
- getErrorIndex() - Method in class org.sonar.sslr.internal.matchers.ErrorLocatingHandler
-
- getErrorIndex() - Method in class org.sonar.sslr.parser.ParseError
-
- getExecutionFlow() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getFailedPaths() - Method in class org.sonar.sslr.internal.matchers.ErrorReportingHandler
-
- getFailedPaths() - Method in class org.sonar.sslr.parser.ParseError
-
- getFile() - Method in class com.sonar.sslr.api.LexerOutput
-
- getFile() - Method in class com.sonar.sslr.api.Token
-
FIXME no such method in SSLR 1.9
- getFile() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getFileAbsolutePath() - Method in class com.sonar.sslr.api.LexerOutput
-
- getFileName() - Method in class com.sonar.sslr.api.LexerOutput
-
- getFileName() - Method in class com.sonarsource.cobol.api.symbol.FileSymbol
-
- getFiles() - Method in class com.sonarsource.cobol.api.symbol.CobolSymbolTable
-
- getFileStatusCode() - Method in class com.sonarsource.cobol.api.symbol.FileSymbol
-
- getFileSymbol() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getFirstChild() - Method in class com.sonar.sslr.api.AstNode
-
Get the first child of this node
- getFirstLevelDataItems() - Method in class com.sonarsource.cobol.api.symbol.CobolSymbolTable
-
- getFirstStmt() - Method in class com.sonarsource.cobol.api.flow.CobolExecutionFlowEngine
-
- getFirstToken() - Method in class com.sonar.sslr.api.LexerOutput
-
- getFlowHandler() - Method in class com.sonar.sslr.api.flow.Statement
-
- getFromIndex() - Method in class com.sonar.sslr.api.AstNode
-
- getFromIndex(int) - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- getFullMatches() - Method in class com.sonar.sslr.impl.events.AutoCompleter
-
- getFunctionCallStack() - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- getGrammar() - Method in class com.sonar.sslr.api.PreprocessingDirective
-
- getGrammar() - Method in class com.sonar.sslr.impl.Parser
-
- getGrammar() - Method in class com.sonar.sslr.impl.Parser2
-
- getInitValue() - Method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
- getInputBuffer() - Method in class org.sonar.sslr.parser.ParseError
-
- getInputBuffer() - Method in class org.sonar.sslr.parser.ParsingResult
-
- getInputDataItems() - Method in class com.sonarsource.cobol.api.flow.CobolStatement
-
- getKey() - Method in class com.sonarsource.cobol.api.ast.CobolAstCheck
-
- getKey() - Method in class com.sonarsource.cobol.api.symbol.Module
-
- getLastChild() - Method in class com.sonar.sslr.api.AstNode
-
Get the last child of this node
- getLastToken() - Method in class com.sonar.sslr.api.AstNode
-
- getLastToken() - Method in class com.sonar.sslr.api.LexerOutput
-
- getLength() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getLevel() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getLexerOutput() - Method in class com.sonar.sslr.impl.Parser2
-
- getLine() - Method in exception com.sonar.sslr.api.RecognitionException
-
Line where the parsing error has occurred.
- getLine() - Method in class com.sonar.sslr.api.Token
-
- getLine() - Method in class org.sonar.sslr.internal.matchers.InputBuffer.Position
-
- getLineCount() - Method in class org.sonar.sslr.internal.matchers.ImmutableInputBuffer
-
- getLineCount() - Method in interface org.sonar.sslr.internal.matchers.InputBuffer
-
Returns number of lines, which is always equal to number of line terminators plus 1.
- getLinesOfComment() - Method in class com.sonar.sslr.api.Comments
-
Get the sorted list of lines containing at least a comment
- getList(CobolGrammar) - Static method in class com.sonarsource.cobol.api.ast.ComplexityNodesRepository
-
- getMatcher(int) - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- getMatcher() - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- getMatcher() - Method in class org.sonar.sslr.internal.matchers.MatcherPathElement
-
- getMatcher() - Method in class org.sonar.sslr.internal.matchers.ParseNode
-
- getMatchHandler() - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- getMeasureProviders() - Method in class com.sonarsource.cobol.api.metrics.CobolMeasureProvider
-
- getMemoizedAst(ParsingState) - Method in class com.sonar.sslr.impl.matcher.MemoizedMatcher
-
- getMemoizedAst(MemoizedMatcher) - Method in class com.sonar.sslr.impl.ParsingState
-
- getMessage() - Method in class org.sonar.sslr.parser.ParseError
-
- getModules() - Method in class com.sonarsource.cobol.api.symbol.CobolSymbolTable
-
- getName() - Method in class com.sonar.sslr.api.AstNode
-
- getName() - Method in enum com.sonar.sslr.api.GenericTokenType
-
- getName() - Method in interface com.sonar.sslr.api.TokenType
-
- getName() - Method in class com.sonar.sslr.impl.matcher.RuleMatcher
-
- getName() - Method in enum com.sonarsource.cobol.api.AcuCobolKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.AcuCobolTokenType
-
- getName() - Method in enum com.sonarsource.cobol.api.CICSKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.CobolKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.CobolSpecialCharacter
-
- getName() - Method in enum com.sonarsource.cobol.api.CobolTokenType
-
- getName() - Method in enum com.sonarsource.cobol.api.DliKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.GcosKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.HpKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
- getName() - Method in enum com.sonarsource.cobol.api.MicrofocusKeyword
-
- getName() - Method in enum com.sonarsource.cobol.api.SQLKeyword
-
- getName() - Method in class org.sonar.sslr.internal.matchers.GrammarElementMatcher
-
- getNext() - Method in class com.sonar.sslr.api.flow.Statement
-
- getNode() - Method in class org.sonar.sslr.internal.matchers.BasicMatcherContext
-
- getNode() - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- getNumberOfChildren() - Method in class com.sonar.sslr.api.AstNode
-
- getNumberOfConsumedTokens() - Method in class com.sonar.sslr.api.PreprocessorAction
-
- getOperand() - Method in class com.sonar.sslr.impl.ast.LeftAssociative.OperatorAndOperand
-
Deprecated.
- getOperator() - Method in class com.sonar.sslr.impl.ast.LeftAssociative.OperatorAndOperand
-
Deprecated.
- getOriginalValue() - Method in class com.sonar.sslr.api.Token
-
- getOutpostMatcher() - Method in class com.sonar.sslr.impl.ParsingState
-
- getOutpostMatcherToken() - Method in class com.sonar.sslr.impl.ParsingState
-
- getOutpostMatcherTokenIndex() - Method in class com.sonar.sslr.impl.ParsingState
-
- getOutpostMatcherTokenLine() - Method in class com.sonar.sslr.impl.ParsingState
-
- getOutputDataItems() - Method in class com.sonarsource.cobol.api.flow.CobolStatement
-
- getParent() - Method in class com.sonar.sslr.api.AstNode
-
Get the parent of this node in the tree.
- getParent() - Method in class com.sonar.sslr.api.flow.Branch
-
- getParent() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getParent() - Method in class org.sonar.sslr.internal.matchers.BasicMatcherContext
-
- getParseError() - Method in class org.sonar.sslr.parser.ParsingResult
-
- getParseTreeRoot() - Method in class org.sonar.sslr.parser.ParsingResult
-
- getParsingState() - Method in class com.sonar.sslr.impl.Parser
-
- getParsingState() - Method in class com.sonar.sslr.impl.Parser2
-
- getParsingState() - Method in class org.sonar.sslr.parser.ParserAdapter
-
- getPartialMatches() - Method in class com.sonar.sslr.impl.events.AutoCompleter
-
- getPicture() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getPictureType() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- getPosition(int) - Method in class org.sonar.sslr.internal.matchers.ImmutableInputBuffer
-
- getPosition(int) - Method in interface org.sonar.sslr.internal.matchers.InputBuffer
-
- getPreprocessingDirective() - Method in class com.sonar.sslr.api.Trivia
-
- getPreprocessorClasses() - Method in interface com.sonarsource.cobol.api.lexer.CobolPreprocessorProvider
-
This method must return the custom preprocessor classes that can be used when anlyzing Cobol code.
- getPreprocessors() - Method in class com.sonar.sslr.impl.Lexer2
-
- getPrevious() - Method in class com.sonar.sslr.api.flow.Statement
-
- getProcedureName() - Method in class com.sonarsource.cobol.api.symbol.Procedure
-
- getResult() - Method in class com.sonar.sslr.api.AstNodeBrowser
-
- getResults() - Method in class com.sonar.sslr.api.AstNodeBrowser
-
- getRootRule() - Method in class com.sonar.sslr.api.Grammar
-
Each Grammar has always an entry point whose name is usually by convention the "Computation Unit".
- getRootRule() - Method in class com.sonar.sslr.impl.Parser
-
- getRootRule() - Method in class com.sonar.sslr.impl.Parser2
-
- getRootRule() - Method in class com.sonarsource.cobol.api.AcuCobolExtension
-
- getRootRule() - Method in class com.sonarsource.cobol.api.CicsGrammar
-
- getRootRule() - Method in class com.sonarsource.cobol.api.CobolGrammar
-
- getRootRule() - Method in class com.sonarsource.cobol.api.CopyReplaceGrammar
-
- getRootRule() - Method in class com.sonarsource.cobol.api.DB2Grammar
-
- getRootRule() - Method in class com.sonarsource.cobol.api.GcosExtension
-
- getRootRule() - Method in class com.sonarsource.cobol.api.HpExtension
-
- getRootRule() - Method in class com.sonarsource.cobol.api.ListingControlStatementGrammar
-
- getRootRule() - Method in class com.sonarsource.cobol.api.MicrofocusExtension
-
- getRootRule() - Method in class org.sonar.sslr.parser.ParserAdapter
-
- getRule(int) - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- getRule() - Method in class com.sonar.sslr.impl.matcher.RuleDefinition
-
- getRuleFields(Class) - Static method in class com.sonar.sslr.api.Grammar
-
Find all the direct rule fields declared in the given Grammar class.
- getSqlGrammar() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getStartIndex() - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- getStartIndex() - Method in class org.sonar.sslr.internal.matchers.MatcherPathElement
-
- getStartIndex() - Method in class org.sonar.sslr.internal.matchers.ParseNode
-
- getStartLine() - Method in class com.sonar.sslr.api.symbol.Symbol
-
- getStartLine() - Method in class com.sonarsource.cobol.api.symbol.Module
-
- getStartProcedure() - Method in class com.sonarsource.cobol.api.symbol.Module
-
- getStatement(AstNode) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- getStatements() - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- getSubContext(Matcher) - Method in class org.sonar.sslr.internal.matchers.BasicMatcherContext
-
- getSubContext(Matcher) - Method in class org.sonar.sslr.internal.matchers.MatcherContext
-
- getSubMatchers() - Method in class org.sonar.sslr.internal.matchers.SequenceMatcher
-
- getSymbolTable() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- getToIndex() - Method in class com.sonar.sslr.api.AstNode
-
- getToIndex(int) - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- getToIndex() - Method in class com.sonar.sslr.impl.matcher.Matcher.MatchResult
-
- getToken() - Method in class com.sonar.sslr.api.AstNode
-
Get the Token associated to this AstNode
- getToken() - Method in class com.sonar.sslr.api.Trivia
-
- getToken() - Method in class com.sonarsource.cobol.api.symbol.DataItemValue
-
- getTokenLine() - Method in class com.sonar.sslr.api.AstNode
-
Get the Token's line associated to this AstNode
- getTokenOriginalValue() - Method in class com.sonar.sslr.api.AstNode
-
Get the Token's original value associated to this AstNode
- getTokens() - Method in class com.sonar.sslr.api.AstNode
-
Return all tokens contained in this tree node.
- getTokens() - Method in class com.sonar.sslr.api.LexerOutput
-
- getTokens() - Method in class com.sonar.sslr.api.Trivia
-
- getTokens() - Method in class com.sonar.sslr.impl.Lexer
-
- getTokensToInject() - Method in class com.sonar.sslr.api.PreprocessorAction
-
- getTokenType() - Method in class org.sonar.sslr.internal.matchers.TokenMatcher
-
- getTokenValue() - Method in class com.sonar.sslr.api.AstNode
-
Get the Token's value associated to this AstNode
- getTokenValue() - Method in class com.sonar.sslr.impl.matcher.TokenValueMatcher
-
- getTrivia() - Method in class com.sonar.sslr.api.Token
-
- getTriviaToInject() - Method in class com.sonar.sslr.api.PreprocessorAction
-
- getType() - Method in class com.sonar.sslr.api.AstNode
-
- getType() - Method in class com.sonar.sslr.api.Token
-
- getType() - Method in class com.sonar.sslr.impl.matcher.TokenTypeMatcher
-
- getURI() - Method in class com.sonar.sslr.api.Token
-
- getURI() - Method in class com.sonar.sslr.impl.Lexer
-
- getValue() - Method in enum com.sonar.sslr.api.GenericTokenType
-
- getValue() - Method in class com.sonar.sslr.api.Token
-
- getValue() - Method in interface com.sonar.sslr.api.TokenType
-
- getValue() - Method in enum com.sonarsource.cobol.api.AcuCobolKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.AcuCobolTokenType
-
- getValue() - Method in enum com.sonarsource.cobol.api.CICSKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.CobolKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.CobolSpecialCharacter
-
- getValue() - Method in enum com.sonarsource.cobol.api.CobolTokenType
-
- getValue() - Method in enum com.sonarsource.cobol.api.DliKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.GcosKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.HpKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.MicrofocusKeyword
-
- getValue() - Method in enum com.sonarsource.cobol.api.SQLKeyword
-
- getValue() - Method in class com.sonarsource.cobol.api.symbol.DataItem
-
- globalClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- gobackStatement - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- gotoStatement - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- Grammar - Class in com.sonar.sslr.api
-
- Grammar() - Constructor for class com.sonar.sslr.api.Grammar
-
- grammar - Variable in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
- grammar - Variable in class com.sonarsource.cobol.api.flow.CobolStatement
-
- GrammarElementMatcher - Class in org.sonar.sslr.internal.matchers
-
- GrammarElementMatcher(String) - Constructor for class org.sonar.sslr.internal.matchers.GrammarElementMatcher
-
- GrammarException - Exception in org.sonar.sslr.internal.matchers
-
- GrammarException(String) - Constructor for exception org.sonar.sslr.internal.matchers.GrammarException
-
- GrammarException(Throwable, String) - Constructor for exception org.sonar.sslr.internal.matchers.GrammarException
-
- GrammarFunctions - Class in com.sonar.sslr.impl.matcher
-
This class provides all the functions to define a context-free grammar
- GrammarFunctions.Advanced - Class in com.sonar.sslr.impl.matcher
-
- GrammarFunctions.Predicate - Class in com.sonar.sslr.impl.matcher
-
- GrammarFunctions.Standard - Class in com.sonar.sslr.impl.matcher
-
- GrammarFunctionsMigrator - Class in org.sonar.sslr.parser
-
- GrammarOperators - Class in org.sonar.sslr.parser
-
- gridScreenClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- gripPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- paddingCharacterClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- paragraph - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- Paragraph - Class in com.sonarsource.cobol.api.symbol
-
- Paragraph(String, AstNode) - Constructor for class com.sonarsource.cobol.api.symbol.Paragraph
-
- paragraphName - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- parse(File) - Method in class com.sonar.sslr.impl.Parser
-
- parse(String) - Method in class com.sonar.sslr.impl.Parser
-
- parse(List<Token>) - Method in class com.sonar.sslr.impl.Parser
-
- parse(File) - Method in class com.sonar.sslr.impl.Parser2
-
- parse(String) - Method in class com.sonar.sslr.impl.Parser2
-
- parse(List<Token>) - Method in class com.sonar.sslr.impl.Parser2
-
- parse(String) - Method in class org.sonar.sslr.parser.ParserAdapter
-
- parse(File) - Method in class org.sonar.sslr.parser.ParserAdapter
-
- parse(List<Token>) - Method in class org.sonar.sslr.parser.ParserAdapter
-
- parse(char[]) - Method in class org.sonar.sslr.parser.ParseRunner
-
- ParseError - Class in org.sonar.sslr.parser
-
Describes an error, which is occurred during parse.
- ParseError(InputBuffer, int, String, List<List<MatcherPathElement>>) - Constructor for class org.sonar.sslr.parser.ParseError
-
- ParseErrorFormatter - Class in org.sonar.sslr.parser
-
- ParseErrorFormatter() - Constructor for class org.sonar.sslr.parser.ParseErrorFormatter
-
- ParseNode - Class in org.sonar.sslr.internal.matchers
-
Node of a parse tree.
- ParseNode(int, int, List<ParseNode>, Matcher) - Constructor for class org.sonar.sslr.internal.matchers.ParseNode
-
- Parser<G extends Grammar> - Class in com.sonar.sslr.impl
-
- Parser(G) - Constructor for class com.sonar.sslr.impl.Parser
-
- Parser.Builder<G extends Grammar> - Class in com.sonar.sslr.impl
-
- Parser2<GRAMMAR extends Grammar> - Class in com.sonar.sslr.impl
-
This class allows to ensure forward compatibility with SSLR 1.9.
- Parser2.ParserBuilder<GRAMMAR extends Grammar> - Class in com.sonar.sslr.impl
-
- ParserAdapter<G extends LexerlessGrammar> - Class in org.sonar.sslr.parser
-
- ParserAdapter(Charset, G) - Constructor for class org.sonar.sslr.parser.ParserAdapter
-
- ParserRuntimeException - Exception in org.sonar.sslr.internal.matchers
-
- ParserRuntimeException(Throwable) - Constructor for exception org.sonar.sslr.internal.matchers.ParserRuntimeException
-
- ParseRunner - Class in org.sonar.sslr.parser
-
Performs parsing of a given grammar rule on a given input text.
- ParseRunner(Rule) - Constructor for class org.sonar.sslr.parser.ParseRunner
-
- ParsingEventListener - Class in com.sonar.sslr.impl.events
-
- ParsingEventListener() - Constructor for class com.sonar.sslr.impl.events.ParsingEventListener
-
- parsingEventListeners - Variable in class com.sonar.sslr.impl.ParsingState
-
- ParsingResult - Class in org.sonar.sslr.parser
-
Parsing result.
- ParsingResult(InputBuffer, boolean, ParseNode, ParseError) - Constructor for class org.sonar.sslr.parser.ParsingResult
-
- ParsingStackTrace - Class in com.sonar.sslr.impl
-
- ParsingState - Class in com.sonar.sslr.impl
-
- ParsingState(List<Token>) - Constructor for class com.sonar.sslr.impl.ParsingState
-
- passwordClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- PatternMatcher - Class in org.sonar.sslr.internal.matchers
-
- PatternMatcher(String) - Constructor for class org.sonar.sslr.internal.matchers.PatternMatcher
-
- peek() - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine.FunctionCallStack
-
- peek() - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- peekFromIndex() - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- peekMatcher() - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- peekRule() - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- peekSourceCode() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
Do not use
- peekToIndex() - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- peekToken(int, Matcher) - Method in class com.sonar.sslr.impl.ParsingState
-
- peekToken(Matcher) - Method in class com.sonar.sslr.impl.ParsingState
-
- peekTokenIfExists(int, Matcher) - Method in class com.sonar.sslr.impl.ParsingState
-
- performAfterClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performFlavour - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performProcedureScopeClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performStatement - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performTestPositionClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performTimeClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performUntilClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performVaryingClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- performVaryingWithTestClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- picturePunctuation - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- pictureScreenClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- pictureString - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- pop() - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine.FunctionCallStack
-
- pop() - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- popSourceCode() - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
Do not use
- popToken(Matcher) - Method in class com.sonar.sslr.impl.ParsingState
-
- popupMenuPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- power - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- PreprocessingDirective - Class in com.sonar.sslr.api
-
- PreprocessingDirective() - Constructor for class com.sonar.sslr.api.PreprocessingDirective
-
- Preprocessor - Class in com.sonar.sslr.api
-
A preprocessor is a component which can alter the stream of Token and Trivia.
The supported operations are injection and deletion.
- Preprocessor() - Constructor for class com.sonar.sslr.api.Preprocessor
-
- Preprocessor2 - Class in com.sonar.sslr.api
-
A Preprocessor can be used to modify the content of the LexerOuput before launching the parser.
- Preprocessor2() - Constructor for class com.sonar.sslr.api.Preprocessor2
-
- PreprocessorAction - Class in com.sonar.sslr.api
-
This class encapsulates the actions to be performed by a preprocessor.
- PreprocessorAction(int, List<Trivia>, List<Token>) - Constructor for class com.sonar.sslr.api.PreprocessorAction
-
Construct a preprocessor action.
- previousAstNode() - Method in class com.sonar.sslr.api.AstNode
-
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.
- previousSibling() - Method in class com.sonar.sslr.api.AstNode
-
Get the previous sibling AstNode if exists in the tree.
- print(AstNode) - Static method in class com.sonar.sslr.impl.ast.AstXmlPrinter
-
- print(AstNode, Writer) - Static method in class com.sonar.sslr.impl.ast.AstXmlPrinter
-
- print(ExtendedStackTrace, PrintStream) - Static method in class com.sonar.sslr.impl.events.ExtendedStackTraceStream
-
- print(Matcher) - Static method in class com.sonar.sslr.impl.matcher.MatcherTreePrinter
-
- printStackTrace(PrintStream) - Method in class com.sonar.sslr.impl.Parser
-
- printStackTrace(PrintStream) - Method in class com.sonar.sslr.impl.Parser2
-
- Procedure - Class in com.sonarsource.cobol.api.symbol
-
- Procedure(String, AstNode) - Constructor for class com.sonarsource.cobol.api.symbol.Procedure
-
- procedureBody - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- procedureDivision - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
* Procedure Division ****
- procedureDivisionUsingKeyword - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- procedureName - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- procedurePhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- procedureSection - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- process(List<Token>) - Method in class com.sonar.sslr.api.Preprocessor
-
Method called on each token seen by the current preprocessor.
- process(Token, LexerOutput) - Method in class com.sonar.sslr.api.Preprocessor2
-
This method is called just before adding a new Token to the LexerOutput.
- processException(Exception) - Method in interface com.sonar.sslr.api.AuditListener
-
This method is called when an exception different from a parsing error occurs
- processFlow(ExecutionFlowEngine) - Method in class com.sonar.sslr.api.flow.FlowHandler
-
- processRecognitionException(RecognitionException) - Method in interface com.sonar.sslr.api.RecognitionExceptionListener
-
This method is called when a recognition exception occurs
- programIdParagraph - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- programName - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- programUnit - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- promptPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- promptScreenClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- propertyName - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- propertyOptionClause - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- propertyPhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- propertyType - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- PunctuatorChannel - Class in com.sonar.sslr.impl.channel
-
- PunctuatorChannel(TokenType...) - Constructor for class com.sonar.sslr.impl.channel.PunctuatorChannel
-
- push(Matcher, int) - Method in class com.sonar.sslr.impl.events.FastStackMatcherAndPosition
-
- pushBackTokenAndProcess(Token, Preprocessor2) - Method in class com.sonar.sslr.api.LexerOutput
-
This method must be called by a preprocessor when a token has been temporary consumed by this preprocessor but finally must be pushed
back to the LexerOutput.
- pushBackTokensAndProcess(List<Token>, Preprocessor2) - Method in class com.sonar.sslr.api.LexerOutput
-
This method must be called by a preprocessor when some tokens have been temporary consumed by this preprocessor but finally must be
pushed back to the LexerOutput.
- valueOf(String) - Static method in enum com.sonar.sslr.api.GenericTokenType
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonar.sslr.api.Trivia.TriviaKind
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.AcuCobolKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.AcuCobolTokenType
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.CICSKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.CobolKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.CobolSpecialCharacter
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.CobolTokenType
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.DliKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.GcosKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.HpKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.MicrofocusKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.SQLKeyword
-
Returns the enum constant of this type with the specified name.
- valueOf(String) - Static method in enum com.sonarsource.cobol.api.symbol.DataItem.PictureType
-
Returns the enum constant of this type with the specified name.
- valueOfClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- valuePhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- values() - Static method in enum com.sonar.sslr.api.GenericTokenType
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonar.sslr.api.Trivia.TriviaKind
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.AcuCobolKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.AcuCobolTokenType
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.CICSKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.CobolKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.CobolSpecialCharacter
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.CobolTokenType
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.DliKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.GcosKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.HpKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.metrics.CobolMetrics
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.MicrofocusKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.SQLKeyword
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- values() - Static method in enum com.sonarsource.cobol.api.symbol.DataItem.PictureType
-
Returns an array containing the constants of this enum type, in
the order they are declared.
- valueScreenClause - Variable in class com.sonarsource.cobol.api.CobolGrammar
-
- visiblePhrase - Variable in class com.sonarsource.cobol.api.AcuCobolExtension
-
- visitBranch(Branch) - Method in class com.sonar.sslr.api.flow.ExecutionFlowVisitor
-
- visitBranch(Branch) - Method in class com.sonarsource.cobol.api.flow.CobolDataFlowEngine
-
- visitFile(AstNode) - Method in interface com.sonar.sslr.api.AstVisitor
-
Called before starting visiting a computation unit tree.
- visitFile(AstNode) - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
Called before starting visiting a computation unit tree.
- visitFlow(AstNode, ExecutionFlowVisitor<STATEMENT>...) - Method in interface com.sonar.sslr.api.flow.ExecutionFlow
-
- visitFlow(ExecutionFlowVisitor<STATEMENT>...) - Method in interface com.sonar.sslr.api.flow.ExecutionFlow
-
- visitFlow(AstNode, ExecutionFlowVisitor...) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- visitFlow(Statement, ExecutionFlowVisitor...) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- visitFlow(Statement) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- visitFlow(ExecutionFlowVisitor...) - Method in class com.sonar.sslr.api.flow.ExecutionFlowEngine
-
- visitFlow(ExecutionFlowVisitor...) - Method in class com.sonarsource.cobol.api.flow.CobolExecutionFlowEngine
-
- visitMandatoryBranches() - Method in class com.sonar.sslr.api.flow.ExecutionFlowVisitor
-
- visitMandatoryBranches() - Method in class com.sonarsource.cobol.api.flow.CobolDataFlowEngine
-
- visitNode(AstNode) - Method in interface com.sonar.sslr.api.AstVisitor
-
Called to process an AST node whose type has been registered to be visited.
- visitNode(AstNode) - Method in class com.sonarsource.cobol.api.ast.CobolAstVisitor
-
Called to process an AST node whose type has been registered to be visited.
- visitStatement(S, Branch) - Method in class com.sonar.sslr.api.flow.ExecutionFlowVisitor
-
- visitStatement(CobolStatement, Branch) - Method in class com.sonarsource.cobol.api.flow.CobolCopyBookBarrier
-
- visitStatement(CobolStatement, Branch) - Method in class com.sonarsource.cobol.api.flow.CobolDataFlowEngine
-
- visitStatement(CobolStatement, Branch) - Method in class com.sonarsource.cobol.api.flow.CobolRecursionBarrier
-
- visitToken(Token) - Method in interface com.sonar.sslr.api.AstAndTokenVisitor
-
Called sequentially for each token generated by the Lexer