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

Safe HaskellNone
LanguageHaskell2010

TreeSitter.Java

Synopsis

Documentation

tree_sitter_java :: Ptr Language #

data Grammar Source #

Statically-known rules corresponding to symbols in the grammar.

Constructors

End 
Identifier 
DecimalIntegerLiteral 
HexIntegerLiteral 
OctalIntegerLiteral 
BinaryIntegerLiteral 
DecimalFloatingPointLiteral 
HexFloatingPointLiteral 
True 
False 
CharacterLiteral 
StringLiteral 
NullLiteral 
AnonLParen 
AnonAmpersand 
AnonRParen 
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 
AnonNew 
AnonLBracket 
AnonRBracket 
AnonDot 
AnonClass 
AnonColonColon 
AnonExtends 
AnonSemicolon 
AnonLBrace 
AnonRBrace 
AnonAssert 
AnonSwitch 
AnonCase 
AnonDefault 
AnonDo 
AnonWhile 
AnonBreak 
AnonContinue 
AnonReturn 
AnonSynchronized 
AnonThrow 
AnonTry 
AnonCatch 
AnonFinally 
AnonIf 
AnonElse 
AnonFor 
AnonAt 
AnonOpen 
AnonModule 
AnonRequires 
AnonExports 
AnonTo 
AnonOpens 
AnonUses 
AnonProvides 
AnonWith 
AnonTransitive 
AnonStatic 
AnonPackage 
AnonImport 
AnonEnum 
AnonPublic 
AnonProtected 
AnonPrivate 
AnonAbstract 
AnonFinal 
AnonStrictfp 
AnonNative 
AnonTransient 
AnonVolatile 
AnonImplements 
AnonAtInterface 
AnonInterface 
AnonByte 
AnonShort 
AnonInt 
AnonLong 
AnonChar 
AnonFloat 
AnonDouble 
BooleanType 
VoidType 
AnonDotDotDot 
AnonThrows 
This 
Super 
Comment 
Program 
HiddenLiteral 
HiddenExpression 
CastExpression 
AssignmentExpression 
BinaryExpression 
InstanceofExpression 
LambdaExpression 
InferredParameters 
TernaryExpression 
UnaryExpression 
UpdateExpression 
HiddenPrimary 
ArrayCreationExpression 
DimensionsExpr 
HiddenPrimaryNoNewArray 
ParenthesizedExpression 
ClassLiteral 
ObjectCreationExpression 
HiddenUnqualifiedObjectCreationExpression 
FieldAccess 
ArrayAccess 
MethodInvocation 
ArgumentList 
MethodReference 
TypeArguments 
Wildcard 
HiddenWildcardBounds 
Dimensions 
Block 
ExpressionStatement 
LabeledStatement 
AssertStatement 
SwitchStatement 
SwitchBlock 
SwitchLabel 
DoStatement 
BreakStatement 
ContinueStatement 
ReturnStatement 
SynchronizedStatement 
ThrowStatement 
TryStatement 
CatchClause 
CatchFormalParameter 
CatchType 
FinallyClause 
TryWithResourcesStatement 
ResourceSpecification 
Resource 
IfStatement 
WhileStatement 
ForStatement 
ForInit 
EnhancedForStatement 
HiddenAnnotation 
MarkerAnnotation 
Annotation 
AnnotationArgumentList 
ElementValuePair 
HiddenElementValue 
ElementValueArrayInitializer 
HiddenDeclaration 
ModuleDeclaration 
ModuleDirective 
RequiresModifier 
ModuleName 
PackageDeclaration 
ImportDeclaration 
Asterisk 
EnumDeclaration 
EnumBodyDeclarations 
EnumConstant 
ClassDeclaration 
Modifiers 
TypeParameters 
TypeParameter 
TypeBound 
Superclass 
SuperInterfaces 
InterfaceTypeList 
ClassBody 
StaticInitializer 
ConstructorDeclaration 
ConstructorDeclarator 
ConstructorBody 
ExplicitConstructorInvocation 
ScopedIdentifier 
FieldDeclaration 
InterfaceDeclaration 
AnnotationTypeDeclaration 
AnnotationTypeBody 
AnnotationTypeMemberDeclaration 
AnnotationTypeElementDeclaration 
DefaultValue 
NormalInterfaceDeclaration 
ExtendsInterfaces 
InterfaceBody 
InterfaceMemberDeclaration 
ConstantDeclaration 
HiddenVariableDeclaratorList 
VariableDeclarator 
HiddenVariableDeclaratorId 
ArrayInitializer 
HiddenType 
HiddenUnannotatedType 
AnnotatedType 
ScopedTypeIdentifier 
GenericType 
ArrayType 
IntegralType 
FloatingPointType 
HiddenMethodHeader 
HiddenMethodDeclarator 
FormalParameters 
FormalParameter 
ReceiverParameter 
SpreadParameter 
Throws 
LocalVariableDeclarationStatement 
LocalVariableDeclaration 
MethodDeclaration 
AuxProgramRepeat1 
AuxCastExpressionRepeat1 
AuxInferredParametersRepeat1 
AuxArrayCreationExpressionRepeat1 
AuxDimensionsExprRepeat1 
AuxClassLiteralRepeat1 
AuxArgumentListRepeat1 
AuxTypeArgumentsRepeat1 
AuxDimensionsRepeat1 
AuxSwitchBlockRepeat1 
AuxTryStatementRepeat1 
AuxCatchTypeRepeat1 
AuxResourceSpecificationRepeat1 
AuxAnnotationArgumentListRepeat1 
AuxElementValueArrayInitializerRepeat1 
AuxModuleDeclarationRepeat1 
AuxModuleDirectiveRepeat1 
AuxModuleDirectiveRepeat2 
AuxModuleDirectiveRepeat3 
AuxImportDeclarationRepeat1 
AuxEnumDeclarationRepeat1 
AuxEnumBodyDeclarationsRepeat1 
AuxModifiersRepeat1 
AuxTypeParametersRepeat1 
AuxInterfaceTypeListRepeat1 
AuxAnnotationTypeBodyRepeat1 
AuxInterfaceBodyRepeat1 
AuxHiddenVariableDeclaratorListRepeat1 
AuxArrayInitializerRepeat1 
AuxFormalParametersRepeat1 
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

Methods

symbolType :: Grammar -> SymbolType