tree-sitter-java-0.1.0.0: Tree-sitter grammar/parser for Java

Safe HaskellNone
LanguageHaskell2010

TreeSitter.Java

Synopsis

Documentation

data Grammar Source #

Statically-known rules corresponding to symbols in the grammar.

Constructors

END 
AnonSemicolon 
DecimalIntegerLiteral 
HexIntegerLiteral 
OctalIntegerLiteral 
BinaryIntegerLiteral 
LongIntegerLiteral 
DecimalFloatingPointLiteral 
HexFloatingPointLiteral 
True 
False 
AnonSQuote 
AuxSlashLBracketCaretBackslashSQuoteBackslashNRBracketSlash 
AuxSlashBackslashBackslashDotSlash 
AuxSlashBackslashBackslashBackslashNSlash 
StringLiteral 
NullLiteral 
AnonNUL 
AnonSOH 
AnonSTX 
AnonETX 
AnonEOT 
AnonENQ 
AnonACK 
AnonBEL 
AnonBS 
AnonTAB 
AnonLF 
AnonVT 
AnonFF 
AnonCR 
AnonSO 
AnonSI 
AnonDLE 
AnonDC1 
AnonDC2 
AnonDC3 
AnonDC4 
AnonNAK 
AnonSYN 
AnonETB 
AnonCAN 
AnonEM 
AnonSUB 
AnonESC 
AnonFS 
AnonGS 
AnonRS 
AnonUS 
Space 
HorizontalTab 
AuxSlashBackslashBackslashSlash 
AnonU 
AuxSlashLBracketAMinusFaMinusF0Minus9RBracketPlusSlash 
AnonB 
AnonT 
AnonN 
AnonF 
AnonR 
AnonDQuote 
AnonBackslash 
AuxSlashLBracket0Minus7RBracketPlusSlash 
AuxSlashLBracket0Minus3RBracketSlash 
AnonLParen 
AnonRParen 
AnonAmpersand 
AnonEqual 
AnonPlusEqual 
AnonMinusEqual 
AnonStarEqual 
AnonSlashEqual 
AnonAmpersandEqual 
AnonPipeEqual 
AnonCaretEqual 
AnonPercentEqual 
AnonLAngleLAngleEqual 
AnonRAngleRAngleEqual 
AnonRAngleRAngleRAngleEqual 
AnonRAngle 
AnonLAngle 
AnonEqualEqual 
AnonRAngleEqual 
AnonLAngleEqual 
AnonBangEqual 
AnonAmpersandAmpersand 
AnonPipePipe 
AnonPlus 
AnonMinus 
AnonStar 
AnonSlash 
AnonPipe 
AnonCaret 
AnonPercent 
AnonLAngleLAngle 
AnonRAngleRAngle 
AnonRAngleRAngleRAngle 
AnonInstanceof 
AnonMinusRAngle 
AnonComma 
AnonQuestion 
AnonColon 
AnonBang 
AnonTilde 
AnonPlusPlus 
AnonMinusMinus 
AnonAssert 
AnonSwitch 
AnonLBrace 
AnonRBrace 
AnonCase 
AnonDefault 
AnonDo 
AnonWhile 
AnonBreak 
AnonContinue 
AnonReturn 
AnonSynchronized 
AnonThrow 
AnonTry 
AnonCatch 
AnonFinally 
AnonIf 
AnonElse 
AnonFor 
AnonLAngleRAngle 
AnonExtends 
AnonLBracket 
AnonRBracket 
AnonByte 
AnonShort 
AnonInt 
AnonLong 
AnonChar 
AnonFloat 
AnonDouble 
BooleanType 
VoidType 
AnonAt 
AnonOpen 
AnonModule 
AnonRequires 
AnonExports 
AnonTo 
AnonOpens 
AnonUses 
AnonProvides 
AnonWith 
AnonTransitive 
AnonStatic 
AnonDot 
AnonPackage 
AnonImport 
AnonEnum 
AnonClass 
AnonPublic 
AnonProtected 
AnonPrivate 
AnonAbstract 
AnonFinal 
AnonStrictfp 
AnonNative 
AnonTransient 
AnonVolatile 
AnonImplements 
AnonNew 
AnonColonColon 
AnonAtInterface 
AnonInterface 
AnonDotDotDot 
This 
Super 
AnonThrows 
Identifier 
Comment 
Program 
HiddenStatement 
HiddenMethodStatement 
HiddenExpressionStatement 
HiddenSemicolon 
HiddenLiteral 
IntegerLiteral 
FloatingPointLiteral 
BooleanLiteral 
CharacterLiteral 
HiddenExpression 
CastExpression 
AdditionalBound 
AssignmentExpression 
Lhs 
BinaryExpression 
LambdaExpression 
HiddenLambdaParameters 
InferredParameters 
LambdaBody 
TernaryExpression 
UnaryExpression 
UpdateExpression 
LabeledStatement 
AssertStatement 
SwitchStatement 
SwitchBlock 
SwitchLabel 
DoStatement 
BreakStatement 
ContinueStatement 
ReturnStatement 
SynchronizedStatement 
ThrowStatement 
TryStatement 
Catches 
CatchClause 
CatchFormalParameter 
CatchType 
Finally 
TryWithResourcesStatement 
ResourceSpecification 
Resource 
VariableAccess 
IfThenElseStatement 
WhileStatement 
ForStatement 
BasicForStatement 
ForInit 
EnhancedForStatement 
HiddenTypeArgumentsOrDiamond 
HiddenTypeArguments 
TypeArgument 
Wildcard 
HiddenWildcardBounds 
Dims 
IntegralType 
FloatingPointType 
HiddenAnnotation 
NormalAnnotation 
MarkerAnnotation 
SingleElementAnnotation 
ElementValuePairList 
ElementValuePair 
ElementValue 
ElementValueArrayInitializer 
HiddenDeclaration 
ModuleDeclaration 
ModuleDirective 
RequiresModifier 
ModuleName 
PackageDeclaration 
ImportDeclaration 
Asterisk 
EnumDeclaration 
EnumBodyDeclarations 
EnumConstant 
ClassDeclaration 
Modifier 
TypeParameters 
TypeParameter 
TypeBound 
Superclass 
SuperInterfaces 
InterfaceTypeList 
ClassBody 
StaticInitializer 
ConstructorDeclaration 
ConstructorDeclarator 
ConstructorBody 
ExplicitConstructorInvocation 
ScopedIdentifier 
FieldDeclaration 
HiddenPrimary 
ArrayCreationExpression 
HiddenDimsExprs 
DimsExpr 
HiddenPrimaryNoNewArray 
ClassLiteral 
ClassInstanceCreationExpression 
UnqualifiedClassInstanceCreationExpression 
FieldAccess 
ArrayAccess 
MethodInvocation 
ArgumentList 
MethodReference 
InterfaceDeclaration 
AnnotationTypeDeclaration 
AnnotationTypeBody 
AnnotationTypeMemberDeclaration 
AnnotationTypeElementDeclaration 
DefaultValue 
NormalInterfaceDeclaration 
ExtendsInterfaces 
InterfaceBody 
InterfaceMemberDeclaration 
ConstantDeclaration 
VariableDeclaratorList 
VariableDeclarator 
VariableDeclaratorId 
ArrayInitializer 
HiddenType 
HiddenUnannType 
AnnotatedType 
ScopedTypeIdentifier 
GenericType 
ArrayType 
MethodHeader 
MethodDeclarator 
FormalParameter 
ReceiverParameter 
SpreadParameter 
Throws 
ExceptionTypeList 
ExceptionType 
MethodBody 
Block 
LocalVariableDeclarationStatement 
LocalVariableDeclaration 
MethodDeclaration 
HiddenReservedIdentifier 
AuxProgramRepeat1 
AuxCharacterLiteralRepeat1 
AuxCastExpressionRepeat1 
AuxInferredParametersRepeat1 
AuxSwitchBlockRepeat1 
AuxCatchesRepeat1 
AuxCatchFormalParameterRepeat1 
AuxCatchTypeRepeat1 
AuxResourceSpecificationRepeat1 
AuxBasicForStatementRepeat1 
AuxHiddenTypeArgumentsRepeat1 
AuxWildcardRepeat1 
AuxDimsRepeat1 
AuxElementValuePairListRepeat1 
AuxElementValueArrayInitializerRepeat1 
AuxModuleDeclarationRepeat1 
AuxModuleDirectiveRepeat1 
AuxModuleDirectiveRepeat2 
AuxModuleDirectiveRepeat3 
AuxImportDeclarationRepeat1 
AuxEnumDeclarationRepeat1 
AuxEnumBodyDeclarationsRepeat1 
AuxTypeParametersRepeat1 
AuxTypeBoundRepeat1 
AuxInterfaceTypeListRepeat1 
AuxConstructorBodyRepeat1 
AuxHiddenDimsExprsRepeat1 
AuxClassLiteralRepeat1 
AuxAnnotationTypeBodyRepeat1 
AuxInterfaceBodyRepeat1 
AuxVariableDeclaratorListRepeat1 
AuxArrayInitializerRepeat1 
AuxFormalParametersRepeat1 
AuxExceptionTypeListRepeat1 
Identifier' 
TypeIdentifier 
ParseError 
Instances
Bounded Grammar Source # 
Instance details

Defined in TreeSitter.Java

Enum Grammar Source # 
Instance details

Defined in TreeSitter.Java

Eq Grammar Source # 
Instance details

Defined in TreeSitter.Java

Methods

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

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

Ord Grammar Source # 
Instance details

Defined in TreeSitter.Java

Show Grammar Source # 
Instance details

Defined in TreeSitter.Java

Ix Grammar Source # 
Instance details

Defined in TreeSitter.Java

Symbol Grammar Source # 
Instance details

Defined in TreeSitter.Java