Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
A Java syntax module. Based on the Oracle Java SE 12 BNF: | https://docs.oracle.com/javase/specs/jls/se12/html/jls-19.html | Note: all *WithComments types were added manually, rather than derived from the BNF, which does not allow for comments.
Synopsis
- newtype Identifier = Identifier {}
- _Identifier :: Name
- newtype TypeIdentifier = TypeIdentifier {}
- _TypeIdentifier :: Name
- data Literal
- _Literal :: Name
- _Literal_null :: FieldName
- _Literal_integer :: FieldName
- _Literal_floatingPoint :: FieldName
- _Literal_boolean :: FieldName
- _Literal_character :: FieldName
- _Literal_string :: FieldName
- newtype IntegerLiteral = IntegerLiteral {}
- _IntegerLiteral :: Name
- newtype FloatingPointLiteral = FloatingPointLiteral {}
- _FloatingPointLiteral :: Name
- newtype StringLiteral = StringLiteral {}
- _StringLiteral :: Name
- data Type
- _Type :: Name
- _Type_primitive :: FieldName
- _Type_reference :: FieldName
- data PrimitiveTypeWithAnnotations = PrimitiveTypeWithAnnotations {}
- _PrimitiveTypeWithAnnotations :: Name
- _PrimitiveTypeWithAnnotations_type :: FieldName
- _PrimitiveTypeWithAnnotations_annotations :: FieldName
- data PrimitiveType
- _PrimitiveType :: Name
- _PrimitiveType_numeric :: FieldName
- _PrimitiveType_boolean :: FieldName
- data NumericType
- _NumericType :: Name
- _NumericType_integral :: FieldName
- _NumericType_floatingPoint :: FieldName
- data IntegralType
- _IntegralType :: Name
- _IntegralType_byte :: FieldName
- _IntegralType_short :: FieldName
- _IntegralType_int :: FieldName
- _IntegralType_long :: FieldName
- _IntegralType_char :: FieldName
- data FloatingPointType
- _FloatingPointType :: Name
- _FloatingPointType_float :: FieldName
- _FloatingPointType_double :: FieldName
- data ReferenceType
- _ReferenceType :: Name
- _ReferenceType_classOrInterface :: FieldName
- _ReferenceType_variable :: FieldName
- _ReferenceType_array :: FieldName
- data ClassOrInterfaceType
- _ClassOrInterfaceType :: Name
- _ClassOrInterfaceType_class :: FieldName
- _ClassOrInterfaceType_interface :: FieldName
- data ClassType = ClassType {}
- _ClassType :: Name
- _ClassType_annotations :: FieldName
- _ClassType_qualifier :: FieldName
- _ClassType_identifier :: FieldName
- _ClassType_arguments :: FieldName
- data ClassTypeQualifier
- _ClassTypeQualifier :: Name
- _ClassTypeQualifier_none :: FieldName
- _ClassTypeQualifier_package :: FieldName
- _ClassTypeQualifier_parent :: FieldName
- newtype InterfaceType = InterfaceType {}
- _InterfaceType :: Name
- data TypeVariable = TypeVariable {}
- _TypeVariable :: Name
- _TypeVariable_annotations :: FieldName
- _TypeVariable_identifier :: FieldName
- data ArrayType = ArrayType {}
- _ArrayType :: Name
- _ArrayType_dims :: FieldName
- _ArrayType_variant :: FieldName
- data ArrayType_Variant
- _ArrayType_Variant :: Name
- _ArrayType_Variant_primitive :: FieldName
- _ArrayType_Variant_classOrInterface :: FieldName
- _ArrayType_Variant_variable :: FieldName
- newtype Dims = Dims {
- unDims :: [[Annotation]]
- _Dims :: Name
- data TypeParameter = TypeParameter {}
- _TypeParameter :: Name
- _TypeParameter_modifiers :: FieldName
- _TypeParameter_identifier :: FieldName
- _TypeParameter_bound :: FieldName
- newtype TypeParameterModifier = TypeParameterModifier {}
- _TypeParameterModifier :: Name
- data TypeBound
- _TypeBound :: Name
- _TypeBound_variable :: FieldName
- _TypeBound_classOrInterface :: FieldName
- data TypeBound_ClassOrInterface = TypeBound_ClassOrInterface {}
- _TypeBound_ClassOrInterface :: Name
- _TypeBound_ClassOrInterface_type :: FieldName
- _TypeBound_ClassOrInterface_additional :: FieldName
- newtype AdditionalBound = AdditionalBound {}
- _AdditionalBound :: Name
- data TypeArgument
- _TypeArgument :: Name
- _TypeArgument_reference :: FieldName
- _TypeArgument_wildcard :: FieldName
- data Wildcard = Wildcard {}
- _Wildcard :: Name
- _Wildcard_annotations :: FieldName
- _Wildcard_wildcard :: FieldName
- data WildcardBounds
- _WildcardBounds :: Name
- _WildcardBounds_extends :: FieldName
- _WildcardBounds_super :: FieldName
- data ModuleName = ModuleName {}
- _ModuleName :: Name
- _ModuleName_identifier :: FieldName
- _ModuleName_name :: FieldName
- newtype PackageName = PackageName {
- unPackageName :: [Identifier]
- _PackageName :: Name
- data TypeName = TypeName {}
- _TypeName :: Name
- _TypeName_identifier :: FieldName
- _TypeName_qualifier :: FieldName
- data ExpressionName = ExpressionName {}
- _ExpressionName :: Name
- _ExpressionName_qualifier :: FieldName
- _ExpressionName_identifier :: FieldName
- newtype MethodName = MethodName {}
- _MethodName :: Name
- newtype PackageOrTypeName = PackageOrTypeName {}
- _PackageOrTypeName :: Name
- newtype AmbiguousName = AmbiguousName {}
- _AmbiguousName :: Name
- data CompilationUnit
- _CompilationUnit :: Name
- _CompilationUnit_ordinary :: FieldName
- _CompilationUnit_modular :: FieldName
- data OrdinaryCompilationUnit = OrdinaryCompilationUnit {}
- _OrdinaryCompilationUnit :: Name
- _OrdinaryCompilationUnit_package :: FieldName
- _OrdinaryCompilationUnit_imports :: FieldName
- _OrdinaryCompilationUnit_types :: FieldName
- data ModularCompilationUnit = ModularCompilationUnit {}
- _ModularCompilationUnit :: Name
- _ModularCompilationUnit_imports :: FieldName
- _ModularCompilationUnit_module :: FieldName
- data PackageDeclaration = PackageDeclaration {}
- _PackageDeclaration :: Name
- _PackageDeclaration_modifiers :: FieldName
- _PackageDeclaration_identifiers :: FieldName
- newtype PackageModifier = PackageModifier {}
- _PackageModifier :: Name
- data ImportDeclaration
- _ImportDeclaration :: Name
- _ImportDeclaration_singleType :: FieldName
- _ImportDeclaration_typeImportOnDemand :: FieldName
- _ImportDeclaration_singleStaticImport :: FieldName
- _ImportDeclaration_staticImportOnDemand :: FieldName
- newtype SingleTypeImportDeclaration = SingleTypeImportDeclaration {}
- _SingleTypeImportDeclaration :: Name
- newtype TypeImportOnDemandDeclaration = TypeImportOnDemandDeclaration {}
- _TypeImportOnDemandDeclaration :: Name
- data SingleStaticImportDeclaration = SingleStaticImportDeclaration {}
- _SingleStaticImportDeclaration :: Name
- _SingleStaticImportDeclaration_typeName :: FieldName
- _SingleStaticImportDeclaration_identifier :: FieldName
- newtype StaticImportOnDemandDeclaration = StaticImportOnDemandDeclaration {}
- _StaticImportOnDemandDeclaration :: Name
- data TypeDeclaration
- _TypeDeclaration :: Name
- _TypeDeclaration_class :: FieldName
- _TypeDeclaration_interface :: FieldName
- _TypeDeclaration_none :: FieldName
- data TypeDeclarationWithComments = TypeDeclarationWithComments {}
- _TypeDeclarationWithComments :: Name
- _TypeDeclarationWithComments_value :: FieldName
- _TypeDeclarationWithComments_comments :: FieldName
- data ModuleDeclaration = ModuleDeclaration {}
- _ModuleDeclaration :: Name
- _ModuleDeclaration_annotations :: FieldName
- _ModuleDeclaration_open :: FieldName
- _ModuleDeclaration_identifiers :: FieldName
- _ModuleDeclaration_directives :: FieldName
- data ModuleDirective
- _ModuleDirective :: Name
- _ModuleDirective_requires :: FieldName
- _ModuleDirective_exports :: FieldName
- _ModuleDirective_opens :: FieldName
- _ModuleDirective_uses :: FieldName
- _ModuleDirective_provides :: FieldName
- data ModuleDirective_Requires = ModuleDirective_Requires {}
- _ModuleDirective_Requires :: Name
- _ModuleDirective_Requires_modifiers :: FieldName
- _ModuleDirective_Requires_module :: FieldName
- data ModuleDirective_ExportsOrOpens = ModuleDirective_ExportsOrOpens {}
- _ModuleDirective_ExportsOrOpens :: Name
- _ModuleDirective_ExportsOrOpens_package :: FieldName
- _ModuleDirective_ExportsOrOpens_modules :: FieldName
- data ModuleDirective_Provides = ModuleDirective_Provides {}
- _ModuleDirective_Provides :: Name
- _ModuleDirective_Provides_to :: FieldName
- _ModuleDirective_Provides_with :: FieldName
- data RequiresModifier
- _RequiresModifier :: Name
- _RequiresModifier_transitive :: FieldName
- _RequiresModifier_static :: FieldName
- data ClassDeclaration
- _ClassDeclaration :: Name
- _ClassDeclaration_normal :: FieldName
- _ClassDeclaration_enum :: FieldName
- data NormalClassDeclaration = NormalClassDeclaration {}
- _NormalClassDeclaration :: Name
- _NormalClassDeclaration_modifiers :: FieldName
- _NormalClassDeclaration_identifier :: FieldName
- _NormalClassDeclaration_parameters :: FieldName
- _NormalClassDeclaration_extends :: FieldName
- _NormalClassDeclaration_implements :: FieldName
- _NormalClassDeclaration_body :: FieldName
- data ClassModifier
- _ClassModifier :: Name
- _ClassModifier_annotation :: FieldName
- _ClassModifier_public :: FieldName
- _ClassModifier_protected :: FieldName
- _ClassModifier_private :: FieldName
- _ClassModifier_abstract :: FieldName
- _ClassModifier_static :: FieldName
- _ClassModifier_final :: FieldName
- _ClassModifier_strictfp :: FieldName
- newtype ClassBody = ClassBody {}
- _ClassBody :: Name
- data ClassBodyDeclaration
- _ClassBodyDeclaration :: Name
- _ClassBodyDeclaration_classMember :: FieldName
- _ClassBodyDeclaration_instanceInitializer :: FieldName
- _ClassBodyDeclaration_staticInitializer :: FieldName
- _ClassBodyDeclaration_constructorDeclaration :: FieldName
- data ClassBodyDeclarationWithComments = ClassBodyDeclarationWithComments {}
- _ClassBodyDeclarationWithComments :: Name
- _ClassBodyDeclarationWithComments_value :: FieldName
- _ClassBodyDeclarationWithComments_comments :: FieldName
- data ClassMemberDeclaration
- _ClassMemberDeclaration :: Name
- _ClassMemberDeclaration_field :: FieldName
- _ClassMemberDeclaration_method :: FieldName
- _ClassMemberDeclaration_class :: FieldName
- _ClassMemberDeclaration_interface :: FieldName
- _ClassMemberDeclaration_none :: FieldName
- data FieldDeclaration = FieldDeclaration {}
- _FieldDeclaration :: Name
- _FieldDeclaration_modifiers :: FieldName
- _FieldDeclaration_unannType :: FieldName
- _FieldDeclaration_variableDeclarators :: FieldName
- data FieldModifier
- _FieldModifier :: Name
- _FieldModifier_annotation :: FieldName
- _FieldModifier_public :: FieldName
- _FieldModifier_protected :: FieldName
- _FieldModifier_private :: FieldName
- _FieldModifier_static :: FieldName
- _FieldModifier_final :: FieldName
- _FieldModifier_transient :: FieldName
- _FieldModifier_volatile :: FieldName
- data VariableDeclarator = VariableDeclarator {}
- _VariableDeclarator :: Name
- _VariableDeclarator_id :: FieldName
- _VariableDeclarator_initializer :: FieldName
- data VariableDeclaratorId = VariableDeclaratorId {}
- _VariableDeclaratorId :: Name
- _VariableDeclaratorId_identifier :: FieldName
- _VariableDeclaratorId_dims :: FieldName
- data VariableInitializer
- _VariableInitializer :: Name
- _VariableInitializer_expression :: FieldName
- _VariableInitializer_arrayInitializer :: FieldName
- newtype UnannType = UnannType {
- unUnannType :: Type
- _UnannType :: Name
- newtype UnannClassType = UnannClassType {}
- _UnannClassType :: Name
- data MethodDeclaration = MethodDeclaration {}
- _MethodDeclaration :: Name
- _MethodDeclaration_annotations :: FieldName
- _MethodDeclaration_modifiers :: FieldName
- _MethodDeclaration_header :: FieldName
- _MethodDeclaration_body :: FieldName
- data MethodModifier
- _MethodModifier :: Name
- _MethodModifier_annotation :: FieldName
- _MethodModifier_public :: FieldName
- _MethodModifier_protected :: FieldName
- _MethodModifier_private :: FieldName
- _MethodModifier_abstract :: FieldName
- _MethodModifier_static :: FieldName
- _MethodModifier_final :: FieldName
- _MethodModifier_synchronized :: FieldName
- _MethodModifier_native :: FieldName
- _MethodModifier_strictfb :: FieldName
- data MethodHeader = MethodHeader {}
- _MethodHeader :: Name
- _MethodHeader_parameters :: FieldName
- _MethodHeader_result :: FieldName
- _MethodHeader_declarator :: FieldName
- _MethodHeader_throws :: FieldName
- data Result
- _Result :: Name
- _Result_type :: FieldName
- _Result_void :: FieldName
- data MethodDeclarator = MethodDeclarator {}
- _MethodDeclarator :: Name
- _MethodDeclarator_identifier :: FieldName
- _MethodDeclarator_receiverParameter :: FieldName
- _MethodDeclarator_formalParameters :: FieldName
- data ReceiverParameter = ReceiverParameter {}
- _ReceiverParameter :: Name
- _ReceiverParameter_annotations :: FieldName
- _ReceiverParameter_unannType :: FieldName
- _ReceiverParameter_identifier :: FieldName
- data FormalParameter
- _FormalParameter :: Name
- _FormalParameter_simple :: FieldName
- _FormalParameter_variableArity :: FieldName
- data FormalParameter_Simple = FormalParameter_Simple {}
- _FormalParameter_Simple :: Name
- _FormalParameter_Simple_modifiers :: FieldName
- _FormalParameter_Simple_type :: FieldName
- _FormalParameter_Simple_id :: FieldName
- data VariableArityParameter = VariableArityParameter {}
- _VariableArityParameter :: Name
- _VariableArityParameter_modifiers :: FieldName
- _VariableArityParameter_type :: FieldName
- _VariableArityParameter_annotations :: FieldName
- _VariableArityParameter_identifier :: FieldName
- data VariableModifier
- _VariableModifier :: Name
- _VariableModifier_annotation :: FieldName
- _VariableModifier_final :: FieldName
- newtype Throws = Throws {
- unThrows :: [ExceptionType]
- _Throws :: Name
- data ExceptionType
- _ExceptionType :: Name
- _ExceptionType_class :: FieldName
- _ExceptionType_variable :: FieldName
- data MethodBody
- _MethodBody :: Name
- _MethodBody_block :: FieldName
- _MethodBody_none :: FieldName
- newtype InstanceInitializer = InstanceInitializer {}
- _InstanceInitializer :: Name
- newtype StaticInitializer = StaticInitializer {}
- _StaticInitializer :: Name
- data ConstructorDeclaration = ConstructorDeclaration {}
- _ConstructorDeclaration :: Name
- _ConstructorDeclaration_modifiers :: FieldName
- _ConstructorDeclaration_constructor :: FieldName
- _ConstructorDeclaration_throws :: FieldName
- _ConstructorDeclaration_body :: FieldName
- data ConstructorModifier
- _ConstructorModifier :: Name
- _ConstructorModifier_annotation :: FieldName
- _ConstructorModifier_public :: FieldName
- _ConstructorModifier_protected :: FieldName
- _ConstructorModifier_private :: FieldName
- data ConstructorDeclarator = ConstructorDeclarator {}
- _ConstructorDeclarator :: Name
- _ConstructorDeclarator_parameters :: FieldName
- _ConstructorDeclarator_name :: FieldName
- _ConstructorDeclarator_receiverParameter :: FieldName
- _ConstructorDeclarator_formalParameters :: FieldName
- newtype SimpleTypeName = SimpleTypeName {}
- _SimpleTypeName :: Name
- data ConstructorBody = ConstructorBody {}
- _ConstructorBody :: Name
- _ConstructorBody_invocation :: FieldName
- _ConstructorBody_statements :: FieldName
- data ExplicitConstructorInvocation = ExplicitConstructorInvocation {}
- _ExplicitConstructorInvocation :: Name
- _ExplicitConstructorInvocation_typeArguments :: FieldName
- _ExplicitConstructorInvocation_arguments :: FieldName
- _ExplicitConstructorInvocation_variant :: FieldName
- data ExplicitConstructorInvocation_Variant
- _ExplicitConstructorInvocation_Variant :: Name
- _ExplicitConstructorInvocation_Variant_this :: FieldName
- _ExplicitConstructorInvocation_Variant_super :: FieldName
- _ExplicitConstructorInvocation_Variant_primary :: FieldName
- data EnumDeclaration = EnumDeclaration {}
- _EnumDeclaration :: Name
- _EnumDeclaration_modifiers :: FieldName
- _EnumDeclaration_identifier :: FieldName
- _EnumDeclaration_implements :: FieldName
- _EnumDeclaration_body :: FieldName
- newtype EnumBody = EnumBody {}
- _EnumBody :: Name
- data EnumBody_Element = EnumBody_Element {}
- _EnumBody_Element :: Name
- _EnumBody_Element_constants :: FieldName
- _EnumBody_Element_bodyDeclarations :: FieldName
- data EnumConstant = EnumConstant {}
- _EnumConstant :: Name
- _EnumConstant_modifiers :: FieldName
- _EnumConstant_identifier :: FieldName
- _EnumConstant_arguments :: FieldName
- _EnumConstant_body :: FieldName
- newtype EnumConstantModifier = EnumConstantModifier {}
- _EnumConstantModifier :: Name
- data InterfaceDeclaration
- _InterfaceDeclaration :: Name
- _InterfaceDeclaration_normalInterface :: FieldName
- _InterfaceDeclaration_annotationType :: FieldName
- data NormalInterfaceDeclaration = NormalInterfaceDeclaration {}
- _NormalInterfaceDeclaration :: Name
- _NormalInterfaceDeclaration_modifiers :: FieldName
- _NormalInterfaceDeclaration_identifier :: FieldName
- _NormalInterfaceDeclaration_parameters :: FieldName
- _NormalInterfaceDeclaration_extends :: FieldName
- _NormalInterfaceDeclaration_body :: FieldName
- data InterfaceModifier
- _InterfaceModifier :: Name
- _InterfaceModifier_annotation :: FieldName
- _InterfaceModifier_public :: FieldName
- _InterfaceModifier_protected :: FieldName
- _InterfaceModifier_private :: FieldName
- _InterfaceModifier_abstract :: FieldName
- _InterfaceModifier_static :: FieldName
- _InterfaceModifier_strictfb :: FieldName
- newtype InterfaceBody = InterfaceBody {}
- _InterfaceBody :: Name
- data InterfaceMemberDeclaration
- _InterfaceMemberDeclaration :: Name
- _InterfaceMemberDeclaration_constant :: FieldName
- _InterfaceMemberDeclaration_interfaceMethod :: FieldName
- _InterfaceMemberDeclaration_class :: FieldName
- _InterfaceMemberDeclaration_interface :: FieldName
- data ConstantDeclaration = ConstantDeclaration {}
- _ConstantDeclaration :: Name
- _ConstantDeclaration_modifiers :: FieldName
- _ConstantDeclaration_type :: FieldName
- _ConstantDeclaration_variables :: FieldName
- data ConstantModifier
- _ConstantModifier :: Name
- _ConstantModifier_annotation :: FieldName
- _ConstantModifier_public :: FieldName
- _ConstantModifier_static :: FieldName
- _ConstantModifier_final :: FieldName
- data InterfaceMethodDeclaration = InterfaceMethodDeclaration {}
- _InterfaceMethodDeclaration :: Name
- _InterfaceMethodDeclaration_modifiers :: FieldName
- _InterfaceMethodDeclaration_header :: FieldName
- _InterfaceMethodDeclaration_body :: FieldName
- data InterfaceMethodModifier
- _InterfaceMethodModifier :: Name
- _InterfaceMethodModifier_annotation :: FieldName
- _InterfaceMethodModifier_public :: FieldName
- _InterfaceMethodModifier_private :: FieldName
- _InterfaceMethodModifier_abstract :: FieldName
- _InterfaceMethodModifier_default :: FieldName
- _InterfaceMethodModifier_static :: FieldName
- _InterfaceMethodModifier_strictfp :: FieldName
- data AnnotationTypeDeclaration = AnnotationTypeDeclaration {}
- _AnnotationTypeDeclaration :: Name
- _AnnotationTypeDeclaration_modifiers :: FieldName
- _AnnotationTypeDeclaration_identifier :: FieldName
- _AnnotationTypeDeclaration_body :: FieldName
- newtype AnnotationTypeBody = AnnotationTypeBody {}
- _AnnotationTypeBody :: Name
- data AnnotationTypeMemberDeclaration
- _AnnotationTypeMemberDeclaration :: Name
- _AnnotationTypeMemberDeclaration_annotationType :: FieldName
- _AnnotationTypeMemberDeclaration_constant :: FieldName
- _AnnotationTypeMemberDeclaration_class :: FieldName
- _AnnotationTypeMemberDeclaration_interface :: FieldName
- data AnnotationTypeElementDeclaration = AnnotationTypeElementDeclaration {}
- _AnnotationTypeElementDeclaration :: Name
- _AnnotationTypeElementDeclaration_modifiers :: FieldName
- _AnnotationTypeElementDeclaration_type :: FieldName
- _AnnotationTypeElementDeclaration_identifier :: FieldName
- _AnnotationTypeElementDeclaration_dims :: FieldName
- _AnnotationTypeElementDeclaration_default :: FieldName
- data AnnotationTypeElementModifier
- _AnnotationTypeElementModifier :: Name
- _AnnotationTypeElementModifier_public :: FieldName
- _AnnotationTypeElementModifier_abstract :: FieldName
- newtype DefaultValue = DefaultValue {}
- _DefaultValue :: Name
- data Annotation
- _Annotation :: Name
- _Annotation_normal :: FieldName
- _Annotation_marker :: FieldName
- _Annotation_singleElement :: FieldName
- data NormalAnnotation = NormalAnnotation {}
- _NormalAnnotation :: Name
- _NormalAnnotation_typeName :: FieldName
- _NormalAnnotation_pairs :: FieldName
- data ElementValuePair = ElementValuePair {}
- _ElementValuePair :: Name
- _ElementValuePair_key :: FieldName
- _ElementValuePair_value :: FieldName
- data ElementValue
- _ElementValue :: Name
- _ElementValue_conditionalExpression :: FieldName
- _ElementValue_elementValueArrayInitializer :: FieldName
- _ElementValue_annotation :: FieldName
- newtype ElementValueArrayInitializer = ElementValueArrayInitializer {}
- _ElementValueArrayInitializer :: Name
- newtype MarkerAnnotation = MarkerAnnotation {}
- _MarkerAnnotation :: Name
- data SingleElementAnnotation = SingleElementAnnotation {}
- _SingleElementAnnotation :: Name
- _SingleElementAnnotation_name :: FieldName
- _SingleElementAnnotation_value :: FieldName
- newtype ArrayInitializer = ArrayInitializer {}
- _ArrayInitializer :: Name
- newtype Block = Block {
- unBlock :: [BlockStatement]
- _Block :: Name
- data BlockStatement
- _BlockStatement :: Name
- _BlockStatement_localVariableDeclaration :: FieldName
- _BlockStatement_class :: FieldName
- _BlockStatement_statement :: FieldName
- newtype LocalVariableDeclarationStatement = LocalVariableDeclarationStatement {}
- _LocalVariableDeclarationStatement :: Name
- data LocalVariableDeclaration = LocalVariableDeclaration {}
- _LocalVariableDeclaration :: Name
- _LocalVariableDeclaration_modifiers :: FieldName
- _LocalVariableDeclaration_type :: FieldName
- _LocalVariableDeclaration_declarators :: FieldName
- data LocalVariableType
- _LocalVariableType :: Name
- _LocalVariableType_type :: FieldName
- _LocalVariableType_var :: FieldName
- data Statement
- _Statement :: Name
- _Statement_withoutTrailing :: FieldName
- _Statement_labeled :: FieldName
- _Statement_ifThen :: FieldName
- _Statement_ifThenElse :: FieldName
- _Statement_while :: FieldName
- _Statement_for :: FieldName
- data StatementNoShortIf
- _StatementNoShortIf :: Name
- _StatementNoShortIf_withoutTrailing :: FieldName
- _StatementNoShortIf_labeled :: FieldName
- _StatementNoShortIf_ifThenElse :: FieldName
- _StatementNoShortIf_while :: FieldName
- _StatementNoShortIf_for :: FieldName
- data StatementWithoutTrailingSubstatement
- = StatementWithoutTrailingSubstatementBlock Block
- | StatementWithoutTrailingSubstatementEmpty EmptyStatement
- | StatementWithoutTrailingSubstatementExpression ExpressionStatement
- | StatementWithoutTrailingSubstatementAssert AssertStatement
- | StatementWithoutTrailingSubstatementSwitch SwitchStatement
- | StatementWithoutTrailingSubstatementDo DoStatement
- | StatementWithoutTrailingSubstatementBreak BreakStatement
- | StatementWithoutTrailingSubstatementContinue ContinueStatement
- | StatementWithoutTrailingSubstatementReturn ReturnStatement
- | StatementWithoutTrailingSubstatementSynchronized SynchronizedStatement
- | StatementWithoutTrailingSubstatementThrow ThrowStatement
- | StatementWithoutTrailingSubstatementTry TryStatement
- _StatementWithoutTrailingSubstatement :: Name
- _StatementWithoutTrailingSubstatement_block :: FieldName
- _StatementWithoutTrailingSubstatement_empty :: FieldName
- _StatementWithoutTrailingSubstatement_expression :: FieldName
- _StatementWithoutTrailingSubstatement_assert :: FieldName
- _StatementWithoutTrailingSubstatement_switch :: FieldName
- _StatementWithoutTrailingSubstatement_do :: FieldName
- _StatementWithoutTrailingSubstatement_break :: FieldName
- _StatementWithoutTrailingSubstatement_continue :: FieldName
- _StatementWithoutTrailingSubstatement_return :: FieldName
- _StatementWithoutTrailingSubstatement_synchronized :: FieldName
- _StatementWithoutTrailingSubstatement_throw :: FieldName
- _StatementWithoutTrailingSubstatement_try :: FieldName
- data EmptyStatement = EmptyStatement {
- _EmptyStatement :: Name
- data LabeledStatement = LabeledStatement {}
- _LabeledStatement :: Name
- _LabeledStatement_identifier :: FieldName
- _LabeledStatement_statement :: FieldName
- data LabeledStatementNoShortIf = LabeledStatementNoShortIf {}
- _LabeledStatementNoShortIf :: Name
- _LabeledStatementNoShortIf_identifier :: FieldName
- _LabeledStatementNoShortIf_statement :: FieldName
- newtype ExpressionStatement = ExpressionStatement {}
- _ExpressionStatement :: Name
- data StatementExpression
- = StatementExpressionAssignment Assignment
- | StatementExpressionPreIncrement PreIncrementExpression
- | StatementExpressionPreDecrement PreDecrementExpression
- | StatementExpressionPostIncrement PostIncrementExpression
- | StatementExpressionPostDecrement PostDecrementExpression
- | StatementExpressionMethodInvocation MethodInvocation
- | StatementExpressionClassInstanceCreation ClassInstanceCreationExpression
- _StatementExpression :: Name
- _StatementExpression_assignment :: FieldName
- _StatementExpression_preIncrement :: FieldName
- _StatementExpression_preDecrement :: FieldName
- _StatementExpression_postIncrement :: FieldName
- _StatementExpression_postDecrement :: FieldName
- _StatementExpression_methodInvocation :: FieldName
- _StatementExpression_classInstanceCreation :: FieldName
- data IfThenStatement = IfThenStatement {}
- _IfThenStatement :: Name
- _IfThenStatement_expression :: FieldName
- _IfThenStatement_statement :: FieldName
- data IfThenElseStatement = IfThenElseStatement {}
- _IfThenElseStatement :: Name
- _IfThenElseStatement_cond :: FieldName
- _IfThenElseStatement_then :: FieldName
- _IfThenElseStatement_else :: FieldName
- data IfThenElseStatementNoShortIf = IfThenElseStatementNoShortIf {}
- _IfThenElseStatementNoShortIf :: Name
- _IfThenElseStatementNoShortIf_cond :: FieldName
- _IfThenElseStatementNoShortIf_then :: FieldName
- _IfThenElseStatementNoShortIf_else :: FieldName
- data AssertStatement
- _AssertStatement :: Name
- _AssertStatement_single :: FieldName
- _AssertStatement_pair :: FieldName
- data AssertStatement_Pair = AssertStatement_Pair {}
- _AssertStatement_Pair :: Name
- _AssertStatement_Pair_first :: FieldName
- _AssertStatement_Pair_second :: FieldName
- data SwitchStatement = SwitchStatement {}
- _SwitchStatement :: Name
- _SwitchStatement_cond :: FieldName
- _SwitchStatement_block :: FieldName
- newtype SwitchBlock = SwitchBlock {}
- _SwitchBlock :: Name
- data SwitchBlock_Pair = SwitchBlock_Pair {}
- _SwitchBlock_Pair :: Name
- _SwitchBlock_Pair_statements :: FieldName
- _SwitchBlock_Pair_labels :: FieldName
- data SwitchBlockStatementGroup = SwitchBlockStatementGroup {}
- _SwitchBlockStatementGroup :: Name
- _SwitchBlockStatementGroup_labels :: FieldName
- _SwitchBlockStatementGroup_statements :: FieldName
- data SwitchLabel
- _SwitchLabel :: Name
- _SwitchLabel_constant :: FieldName
- _SwitchLabel_enumConstant :: FieldName
- _SwitchLabel_default :: FieldName
- newtype EnumConstantName = EnumConstantName {}
- _EnumConstantName :: Name
- data WhileStatement = WhileStatement {}
- _WhileStatement :: Name
- _WhileStatement_cond :: FieldName
- _WhileStatement_body :: FieldName
- data WhileStatementNoShortIf = WhileStatementNoShortIf {}
- _WhileStatementNoShortIf :: Name
- _WhileStatementNoShortIf_cond :: FieldName
- _WhileStatementNoShortIf_body :: FieldName
- data DoStatement = DoStatement {}
- _DoStatement :: Name
- _DoStatement_body :: FieldName
- _DoStatement_conde :: FieldName
- data ForStatement
- _ForStatement :: Name
- _ForStatement_basic :: FieldName
- _ForStatement_enhanced :: FieldName
- data ForStatementNoShortIf
- _ForStatementNoShortIf :: Name
- _ForStatementNoShortIf_basic :: FieldName
- _ForStatementNoShortIf_enhanced :: FieldName
- data BasicForStatement = BasicForStatement {}
- _BasicForStatement :: Name
- _BasicForStatement_cond :: FieldName
- _BasicForStatement_body :: FieldName
- data ForCond = ForCond {}
- _ForCond :: Name
- _ForCond_init :: FieldName
- _ForCond_cond :: FieldName
- _ForCond_update :: FieldName
- data BasicForStatementNoShortIf = BasicForStatementNoShortIf {}
- _BasicForStatementNoShortIf :: Name
- _BasicForStatementNoShortIf_cond :: FieldName
- _BasicForStatementNoShortIf_body :: FieldName
- data ForInit
- _ForInit :: Name
- _ForInit_statements :: FieldName
- _ForInit_localVariable :: FieldName
- newtype ForUpdate = ForUpdate {}
- _ForUpdate :: Name
- data EnhancedForStatement = EnhancedForStatement {}
- _EnhancedForStatement :: Name
- _EnhancedForStatement_cond :: FieldName
- _EnhancedForStatement_body :: FieldName
- data EnhancedForCond = EnhancedForCond {}
- _EnhancedForCond :: Name
- _EnhancedForCond_modifiers :: FieldName
- _EnhancedForCond_type :: FieldName
- _EnhancedForCond_id :: FieldName
- _EnhancedForCond_expression :: FieldName
- data EnhancedForStatementNoShortIf = EnhancedForStatementNoShortIf {}
- _EnhancedForStatementNoShortIf :: Name
- _EnhancedForStatementNoShortIf_cond :: FieldName
- _EnhancedForStatementNoShortIf_body :: FieldName
- newtype BreakStatement = BreakStatement {}
- _BreakStatement :: Name
- newtype ContinueStatement = ContinueStatement {}
- _ContinueStatement :: Name
- newtype ReturnStatement = ReturnStatement {}
- _ReturnStatement :: Name
- newtype ThrowStatement = ThrowStatement {}
- _ThrowStatement :: Name
- data SynchronizedStatement = SynchronizedStatement {}
- _SynchronizedStatement :: Name
- _SynchronizedStatement_expression :: FieldName
- _SynchronizedStatement_block :: FieldName
- data TryStatement
- _TryStatement :: Name
- _TryStatement_simple :: FieldName
- _TryStatement_withFinally :: FieldName
- _TryStatement_withResources :: FieldName
- data TryStatement_Simple = TryStatement_Simple {}
- _TryStatement_Simple :: Name
- _TryStatement_Simple_block :: FieldName
- _TryStatement_Simple_catches :: FieldName
- data TryStatement_WithFinally = TryStatement_WithFinally {}
- _TryStatement_WithFinally :: Name
- _TryStatement_WithFinally_block :: FieldName
- _TryStatement_WithFinally_catches :: FieldName
- _TryStatement_WithFinally_finally :: FieldName
- newtype Catches = Catches {
- unCatches :: [CatchClause]
- _Catches :: Name
- data CatchClause = CatchClause {}
- _CatchClause :: Name
- _CatchClause_parameter :: FieldName
- _CatchClause_block :: FieldName
- data CatchFormalParameter = CatchFormalParameter {}
- _CatchFormalParameter :: Name
- _CatchFormalParameter_modifiers :: FieldName
- _CatchFormalParameter_type :: FieldName
- _CatchFormalParameter_id :: FieldName
- data CatchType = CatchType {}
- _CatchType :: Name
- _CatchType_type :: FieldName
- _CatchType_types :: FieldName
- newtype Finally = Finally {}
- _Finally :: Name
- data TryWithResourcesStatement = TryWithResourcesStatement {}
- _TryWithResourcesStatement :: Name
- _TryWithResourcesStatement_resourceSpecification :: FieldName
- _TryWithResourcesStatement_block :: FieldName
- _TryWithResourcesStatement_catches :: FieldName
- _TryWithResourcesStatement_finally :: FieldName
- newtype ResourceSpecification = ResourceSpecification {}
- _ResourceSpecification :: Name
- data Resource
- _Resource :: Name
- _Resource_local :: FieldName
- _Resource_variable :: FieldName
- data Resource_Local = Resource_Local {}
- _Resource_Local :: Name
- _Resource_Local_modifiers :: FieldName
- _Resource_Local_type :: FieldName
- _Resource_Local_identifier :: FieldName
- _Resource_Local_expression :: FieldName
- data VariableAccess
- _VariableAccess :: Name
- _VariableAccess_expressionName :: FieldName
- _VariableAccess_fieldAccess :: FieldName
- data Primary
- _Primary :: Name
- _Primary_noNewArray :: FieldName
- _Primary_arrayCreation :: FieldName
- data PrimaryNoNewArray
- = PrimaryNoNewArrayLiteral Literal
- | PrimaryNoNewArrayClassLiteral ClassLiteral
- | PrimaryNoNewArrayThis
- | PrimaryNoNewArrayDotThis TypeName
- | PrimaryNoNewArrayParens Expression
- | PrimaryNoNewArrayClassInstance ClassInstanceCreationExpression
- | PrimaryNoNewArrayFieldAccess FieldAccess
- | PrimaryNoNewArrayArrayAccess ArrayAccess
- | PrimaryNoNewArrayMethodInvocation MethodInvocation
- | PrimaryNoNewArrayMethodReference MethodReference
- _PrimaryNoNewArray :: Name
- _PrimaryNoNewArray_literal :: FieldName
- _PrimaryNoNewArray_classLiteral :: FieldName
- _PrimaryNoNewArray_this :: FieldName
- _PrimaryNoNewArray_dotThis :: FieldName
- _PrimaryNoNewArray_parens :: FieldName
- _PrimaryNoNewArray_classInstance :: FieldName
- _PrimaryNoNewArray_fieldAccess :: FieldName
- _PrimaryNoNewArray_arrayAccess :: FieldName
- _PrimaryNoNewArray_methodInvocation :: FieldName
- _PrimaryNoNewArray_methodReference :: FieldName
- data ClassLiteral
- _ClassLiteral :: Name
- _ClassLiteral_type :: FieldName
- _ClassLiteral_numericType :: FieldName
- _ClassLiteral_boolean :: FieldName
- _ClassLiteral_void :: FieldName
- data TypeNameArray
- _TypeNameArray :: Name
- _TypeNameArray_simple :: FieldName
- _TypeNameArray_array :: FieldName
- data NumericTypeArray
- _NumericTypeArray :: Name
- _NumericTypeArray_simple :: FieldName
- _NumericTypeArray_array :: FieldName
- data BooleanArray
- _BooleanArray :: Name
- _BooleanArray_simple :: FieldName
- _BooleanArray_array :: FieldName
- data ClassInstanceCreationExpression = ClassInstanceCreationExpression {}
- _ClassInstanceCreationExpression :: Name
- _ClassInstanceCreationExpression_qualifier :: FieldName
- _ClassInstanceCreationExpression_expression :: FieldName
- data ClassInstanceCreationExpression_Qualifier
- _ClassInstanceCreationExpression_Qualifier :: Name
- _ClassInstanceCreationExpression_Qualifier_expression :: FieldName
- _ClassInstanceCreationExpression_Qualifier_primary :: FieldName
- data UnqualifiedClassInstanceCreationExpression = UnqualifiedClassInstanceCreationExpression {
- unqualifiedClassInstanceCreationExpressionTypeArguments :: [TypeArgument]
- unqualifiedClassInstanceCreationExpressionClassOrInterface :: ClassOrInterfaceTypeToInstantiate
- unqualifiedClassInstanceCreationExpressionArguments :: [Expression]
- unqualifiedClassInstanceCreationExpressionBody :: Maybe ClassBody
- _UnqualifiedClassInstanceCreationExpression :: Name
- _UnqualifiedClassInstanceCreationExpression_typeArguments :: FieldName
- _UnqualifiedClassInstanceCreationExpression_classOrInterface :: FieldName
- _UnqualifiedClassInstanceCreationExpression_arguments :: FieldName
- _UnqualifiedClassInstanceCreationExpression_body :: FieldName
- data ClassOrInterfaceTypeToInstantiate = ClassOrInterfaceTypeToInstantiate {}
- _ClassOrInterfaceTypeToInstantiate :: Name
- _ClassOrInterfaceTypeToInstantiate_identifiers :: FieldName
- _ClassOrInterfaceTypeToInstantiate_typeArguments :: FieldName
- data AnnotatedIdentifier = AnnotatedIdentifier {}
- _AnnotatedIdentifier :: Name
- _AnnotatedIdentifier_annotations :: FieldName
- _AnnotatedIdentifier_identifier :: FieldName
- data TypeArgumentsOrDiamond
- _TypeArgumentsOrDiamond :: Name
- _TypeArgumentsOrDiamond_arguments :: FieldName
- _TypeArgumentsOrDiamond_diamond :: FieldName
- data FieldAccess = FieldAccess {}
- _FieldAccess :: Name
- _FieldAccess_qualifier :: FieldName
- _FieldAccess_identifier :: FieldName
- data FieldAccess_Qualifier
- _FieldAccess_Qualifier :: Name
- _FieldAccess_Qualifier_primary :: FieldName
- _FieldAccess_Qualifier_super :: FieldName
- _FieldAccess_Qualifier_typed :: FieldName
- data ArrayAccess = ArrayAccess {}
- _ArrayAccess :: Name
- _ArrayAccess_expression :: FieldName
- _ArrayAccess_variant :: FieldName
- data ArrayAccess_Variant
- _ArrayAccess_Variant :: Name
- _ArrayAccess_Variant_name :: FieldName
- _ArrayAccess_Variant_primary :: FieldName
- data MethodInvocation = MethodInvocation {}
- _MethodInvocation :: Name
- _MethodInvocation_header :: FieldName
- _MethodInvocation_arguments :: FieldName
- data MethodInvocation_Header
- _MethodInvocation_Header :: Name
- _MethodInvocation_Header_simple :: FieldName
- _MethodInvocation_Header_complex :: FieldName
- data MethodInvocation_Complex = MethodInvocation_Complex {}
- _MethodInvocation_Complex :: Name
- _MethodInvocation_Complex_variant :: FieldName
- _MethodInvocation_Complex_typeArguments :: FieldName
- _MethodInvocation_Complex_identifier :: FieldName
- data MethodInvocation_Variant
- _MethodInvocation_Variant :: Name
- _MethodInvocation_Variant_type :: FieldName
- _MethodInvocation_Variant_expression :: FieldName
- _MethodInvocation_Variant_primary :: FieldName
- _MethodInvocation_Variant_super :: FieldName
- _MethodInvocation_Variant_typeSuper :: FieldName
- data MethodReference
- _MethodReference :: Name
- _MethodReference_expression :: FieldName
- _MethodReference_primary :: FieldName
- _MethodReference_referenceType :: FieldName
- _MethodReference_super :: FieldName
- _MethodReference_new :: FieldName
- _MethodReference_array :: FieldName
- data MethodReference_Expression = MethodReference_Expression {}
- _MethodReference_Expression :: Name
- _MethodReference_Expression_name :: FieldName
- _MethodReference_Expression_typeArguments :: FieldName
- _MethodReference_Expression_identifier :: FieldName
- data MethodReference_Primary = MethodReference_Primary {}
- _MethodReference_Primary :: Name
- _MethodReference_Primary_primary :: FieldName
- _MethodReference_Primary_typeArguments :: FieldName
- _MethodReference_Primary_identifier :: FieldName
- data MethodReference_ReferenceType = MethodReference_ReferenceType {}
- _MethodReference_ReferenceType :: Name
- _MethodReference_ReferenceType_referenceType :: FieldName
- _MethodReference_ReferenceType_typeArguments :: FieldName
- _MethodReference_ReferenceType_identifier :: FieldName
- data MethodReference_Super = MethodReference_Super {}
- _MethodReference_Super :: Name
- _MethodReference_Super_typeArguments :: FieldName
- _MethodReference_Super_identifier :: FieldName
- _MethodReference_Super_super :: FieldName
- data MethodReference_New = MethodReference_New {}
- _MethodReference_New :: Name
- _MethodReference_New_classType :: FieldName
- _MethodReference_New_typeArguments :: FieldName
- newtype MethodReference_Array = MethodReference_Array {}
- _MethodReference_Array :: Name
- data ArrayCreationExpression
- = ArrayCreationExpressionPrimitive ArrayCreationExpression_Primitive
- | ArrayCreationExpressionClassOrInterface ArrayCreationExpression_ClassOrInterface
- | ArrayCreationExpressionPrimitiveArray ArrayCreationExpression_PrimitiveArray
- | ArrayCreationExpressionClassOrInterfaceArray ArrayCreationExpression_ClassOrInterfaceArray
- _ArrayCreationExpression :: Name
- _ArrayCreationExpression_primitive :: FieldName
- _ArrayCreationExpression_classOrInterface :: FieldName
- _ArrayCreationExpression_primitiveArray :: FieldName
- _ArrayCreationExpression_classOrInterfaceArray :: FieldName
- data ArrayCreationExpression_Primitive = ArrayCreationExpression_Primitive {}
- _ArrayCreationExpression_Primitive :: Name
- _ArrayCreationExpression_Primitive_type :: FieldName
- _ArrayCreationExpression_Primitive_dimExprs :: FieldName
- _ArrayCreationExpression_Primitive_dims :: FieldName
- data ArrayCreationExpression_ClassOrInterface = ArrayCreationExpression_ClassOrInterface {}
- _ArrayCreationExpression_ClassOrInterface :: Name
- _ArrayCreationExpression_ClassOrInterface_type :: FieldName
- _ArrayCreationExpression_ClassOrInterface_dimExprs :: FieldName
- _ArrayCreationExpression_ClassOrInterface_dims :: FieldName
- data ArrayCreationExpression_PrimitiveArray = ArrayCreationExpression_PrimitiveArray {}
- _ArrayCreationExpression_PrimitiveArray :: Name
- _ArrayCreationExpression_PrimitiveArray_type :: FieldName
- _ArrayCreationExpression_PrimitiveArray_dims :: FieldName
- _ArrayCreationExpression_PrimitiveArray_array :: FieldName
- data ArrayCreationExpression_ClassOrInterfaceArray = ArrayCreationExpression_ClassOrInterfaceArray {}
- _ArrayCreationExpression_ClassOrInterfaceArray :: Name
- _ArrayCreationExpression_ClassOrInterfaceArray_type :: FieldName
- _ArrayCreationExpression_ClassOrInterfaceArray_dims :: FieldName
- _ArrayCreationExpression_ClassOrInterfaceArray_array :: FieldName
- data DimExpr = DimExpr {}
- _DimExpr :: Name
- _DimExpr_annotations :: FieldName
- _DimExpr_expression :: FieldName
- data Expression
- _Expression :: Name
- _Expression_lambda :: FieldName
- _Expression_assignment :: FieldName
- data LambdaExpression = LambdaExpression {}
- _LambdaExpression :: Name
- _LambdaExpression_parameters :: FieldName
- _LambdaExpression_body :: FieldName
- data LambdaParameters
- _LambdaParameters :: Name
- _LambdaParameters_tuple :: FieldName
- _LambdaParameters_single :: FieldName
- data LambdaParameter
- _LambdaParameter :: Name
- _LambdaParameter_normal :: FieldName
- _LambdaParameter_variableArity :: FieldName
- data LambdaParameter_Normal = LambdaParameter_Normal {}
- _LambdaParameter_Normal :: Name
- _LambdaParameter_Normal_modifiers :: FieldName
- _LambdaParameter_Normal_type :: FieldName
- _LambdaParameter_Normal_id :: FieldName
- data LambdaParameterType
- _LambdaParameterType :: Name
- _LambdaParameterType_type :: FieldName
- _LambdaParameterType_var :: FieldName
- data LambdaBody
- _LambdaBody :: Name
- _LambdaBody_expression :: FieldName
- _LambdaBody_block :: FieldName
- data AssignmentExpression
- _AssignmentExpression :: Name
- _AssignmentExpression_conditional :: FieldName
- _AssignmentExpression_assignment :: FieldName
- data Assignment = Assignment {}
- _Assignment :: Name
- _Assignment_lhs :: FieldName
- _Assignment_op :: FieldName
- _Assignment_expression :: FieldName
- data LeftHandSide
- _LeftHandSide :: Name
- _LeftHandSide_expressionName :: FieldName
- _LeftHandSide_fieldAccess :: FieldName
- _LeftHandSide_arrayAccess :: FieldName
- data AssignmentOperator
- = AssignmentOperatorSimple
- | AssignmentOperatorTimes
- | AssignmentOperatorDiv
- | AssignmentOperatorMod
- | AssignmentOperatorPlus
- | AssignmentOperatorMinus
- | AssignmentOperatorShiftLeft
- | AssignmentOperatorShiftRight
- | AssignmentOperatorShiftRightZeroFill
- | AssignmentOperatorAnd
- | AssignmentOperatorXor
- | AssignmentOperatorOr
- _AssignmentOperator :: Name
- _AssignmentOperator_simple :: FieldName
- _AssignmentOperator_times :: FieldName
- _AssignmentOperator_div :: FieldName
- _AssignmentOperator_mod :: FieldName
- _AssignmentOperator_plus :: FieldName
- _AssignmentOperator_minus :: FieldName
- _AssignmentOperator_shiftLeft :: FieldName
- _AssignmentOperator_shiftRight :: FieldName
- _AssignmentOperator_shiftRightZeroFill :: FieldName
- _AssignmentOperator_and :: FieldName
- _AssignmentOperator_xor :: FieldName
- _AssignmentOperator_or :: FieldName
- data ConditionalExpression
- _ConditionalExpression :: Name
- _ConditionalExpression_simple :: FieldName
- _ConditionalExpression_ternaryCond :: FieldName
- _ConditionalExpression_ternaryLambda :: FieldName
- data ConditionalExpression_TernaryCond = ConditionalExpression_TernaryCond {}
- _ConditionalExpression_TernaryCond :: Name
- _ConditionalExpression_TernaryCond_cond :: FieldName
- _ConditionalExpression_TernaryCond_ifTrue :: FieldName
- _ConditionalExpression_TernaryCond_ifFalse :: FieldName
- data ConditionalExpression_TernaryLambda = ConditionalExpression_TernaryLambda {}
- _ConditionalExpression_TernaryLambda :: Name
- _ConditionalExpression_TernaryLambda_cond :: FieldName
- _ConditionalExpression_TernaryLambda_ifTrue :: FieldName
- _ConditionalExpression_TernaryLambda_ifFalse :: FieldName
- newtype ConditionalOrExpression = ConditionalOrExpression {}
- _ConditionalOrExpression :: Name
- newtype ConditionalAndExpression = ConditionalAndExpression {}
- _ConditionalAndExpression :: Name
- newtype InclusiveOrExpression = InclusiveOrExpression {}
- _InclusiveOrExpression :: Name
- newtype ExclusiveOrExpression = ExclusiveOrExpression {}
- _ExclusiveOrExpression :: Name
- newtype AndExpression = AndExpression {}
- _AndExpression :: Name
- data EqualityExpression
- _EqualityExpression :: Name
- _EqualityExpression_unary :: FieldName
- _EqualityExpression_equal :: FieldName
- _EqualityExpression_notEqual :: FieldName
- data EqualityExpression_Binary = EqualityExpression_Binary {}
- _EqualityExpression_Binary :: Name
- _EqualityExpression_Binary_lhs :: FieldName
- _EqualityExpression_Binary_rhs :: FieldName
- data RelationalExpression
- = RelationalExpressionSimple ShiftExpression
- | RelationalExpressionLessThan RelationalExpression_LessThan
- | RelationalExpressionGreaterThan RelationalExpression_GreaterThan
- | RelationalExpressionLessThanEqual RelationalExpression_LessThanEqual
- | RelationalExpressionGreaterThanEqual RelationalExpression_GreaterThanEqual
- | RelationalExpressionInstanceof RelationalExpression_InstanceOf
- _RelationalExpression :: Name
- _RelationalExpression_simple :: FieldName
- _RelationalExpression_lessThan :: FieldName
- _RelationalExpression_greaterThan :: FieldName
- _RelationalExpression_lessThanEqual :: FieldName
- _RelationalExpression_greaterThanEqual :: FieldName
- _RelationalExpression_instanceof :: FieldName
- data RelationalExpression_LessThan = RelationalExpression_LessThan {}
- _RelationalExpression_LessThan :: Name
- _RelationalExpression_LessThan_lhs :: FieldName
- _RelationalExpression_LessThan_rhs :: FieldName
- data RelationalExpression_GreaterThan = RelationalExpression_GreaterThan {}
- _RelationalExpression_GreaterThan :: Name
- _RelationalExpression_GreaterThan_lhs :: FieldName
- _RelationalExpression_GreaterThan_rhs :: FieldName
- data RelationalExpression_LessThanEqual = RelationalExpression_LessThanEqual {}
- _RelationalExpression_LessThanEqual :: Name
- _RelationalExpression_LessThanEqual_lhs :: FieldName
- _RelationalExpression_LessThanEqual_rhs :: FieldName
- data RelationalExpression_GreaterThanEqual = RelationalExpression_GreaterThanEqual {}
- _RelationalExpression_GreaterThanEqual :: Name
- _RelationalExpression_GreaterThanEqual_lhs :: FieldName
- _RelationalExpression_GreaterThanEqual_rhs :: FieldName
- data RelationalExpression_InstanceOf = RelationalExpression_InstanceOf {}
- _RelationalExpression_InstanceOf :: Name
- _RelationalExpression_InstanceOf_lhs :: FieldName
- _RelationalExpression_InstanceOf_rhs :: FieldName
- data ShiftExpression
- _ShiftExpression :: Name
- _ShiftExpression_unary :: FieldName
- _ShiftExpression_shiftLeft :: FieldName
- _ShiftExpression_shiftRight :: FieldName
- _ShiftExpression_shiftRightZeroFill :: FieldName
- data ShiftExpression_Binary = ShiftExpression_Binary {}
- _ShiftExpression_Binary :: Name
- _ShiftExpression_Binary_lhs :: FieldName
- _ShiftExpression_Binary_rhs :: FieldName
- data AdditiveExpression
- _AdditiveExpression :: Name
- _AdditiveExpression_unary :: FieldName
- _AdditiveExpression_plus :: FieldName
- _AdditiveExpression_minus :: FieldName
- data AdditiveExpression_Binary = AdditiveExpression_Binary {}
- _AdditiveExpression_Binary :: Name
- _AdditiveExpression_Binary_lhs :: FieldName
- _AdditiveExpression_Binary_rhs :: FieldName
- data MultiplicativeExpression
- _MultiplicativeExpression :: Name
- _MultiplicativeExpression_unary :: FieldName
- _MultiplicativeExpression_times :: FieldName
- _MultiplicativeExpression_divide :: FieldName
- _MultiplicativeExpression_mod :: FieldName
- data MultiplicativeExpression_Binary = MultiplicativeExpression_Binary {}
- _MultiplicativeExpression_Binary :: Name
- _MultiplicativeExpression_Binary_lhs :: FieldName
- _MultiplicativeExpression_Binary_rhs :: FieldName
- data UnaryExpression
- _UnaryExpression :: Name
- _UnaryExpression_preIncrement :: FieldName
- _UnaryExpression_preDecrement :: FieldName
- _UnaryExpression_plus :: FieldName
- _UnaryExpression_minus :: FieldName
- _UnaryExpression_other :: FieldName
- newtype PreIncrementExpression = PreIncrementExpression {}
- _PreIncrementExpression :: Name
- newtype PreDecrementExpression = PreDecrementExpression {}
- _PreDecrementExpression :: Name
- data UnaryExpressionNotPlusMinus
- _UnaryExpressionNotPlusMinus :: Name
- _UnaryExpressionNotPlusMinus_postfix :: FieldName
- _UnaryExpressionNotPlusMinus_tilde :: FieldName
- _UnaryExpressionNotPlusMinus_not :: FieldName
- _UnaryExpressionNotPlusMinus_cast :: FieldName
- data PostfixExpression
- _PostfixExpression :: Name
- _PostfixExpression_primary :: FieldName
- _PostfixExpression_name :: FieldName
- _PostfixExpression_postIncrement :: FieldName
- _PostfixExpression_postDecrement :: FieldName
- newtype PostIncrementExpression = PostIncrementExpression {}
- _PostIncrementExpression :: Name
- newtype PostDecrementExpression = PostDecrementExpression {}
- _PostDecrementExpression :: Name
- data CastExpression
- _CastExpression :: Name
- _CastExpression_primitive :: FieldName
- _CastExpression_notPlusMinus :: FieldName
- _CastExpression_lambda :: FieldName
- data CastExpression_Primitive = CastExpression_Primitive {}
- _CastExpression_Primitive :: Name
- _CastExpression_Primitive_type :: FieldName
- _CastExpression_Primitive_expression :: FieldName
- data CastExpression_NotPlusMinus = CastExpression_NotPlusMinus {}
- _CastExpression_NotPlusMinus :: Name
- _CastExpression_NotPlusMinus_refAndBounds :: FieldName
- _CastExpression_NotPlusMinus_expression :: FieldName
- data CastExpression_Lambda = CastExpression_Lambda {}
- _CastExpression_Lambda :: Name
- _CastExpression_Lambda_refAndBounds :: FieldName
- _CastExpression_Lambda_expression :: FieldName
- data CastExpression_RefAndBounds = CastExpression_RefAndBounds {}
- _CastExpression_RefAndBounds :: Name
- _CastExpression_RefAndBounds_type :: FieldName
- _CastExpression_RefAndBounds_bounds :: FieldName
- newtype ConstantExpression = ConstantExpression {}
- _ConstantExpression :: Name
Documentation
newtype Identifier Source #
Instances
Read Identifier Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS Identifier # readList :: ReadS [Identifier] # readPrec :: ReadPrec Identifier # readListPrec :: ReadPrec [Identifier] # | |
Show Identifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> Identifier -> ShowS # show :: Identifier -> String # showList :: [Identifier] -> ShowS # | |
Eq Identifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: Identifier -> Identifier -> Bool # (/=) :: Identifier -> Identifier -> Bool # | |
Ord Identifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: Identifier -> Identifier -> Ordering # (<) :: Identifier -> Identifier -> Bool # (<=) :: Identifier -> Identifier -> Bool # (>) :: Identifier -> Identifier -> Bool # (>=) :: Identifier -> Identifier -> Bool # max :: Identifier -> Identifier -> Identifier # min :: Identifier -> Identifier -> Identifier # |
_Identifier :: Name Source #
newtype TypeIdentifier Source #
Instances
Read TypeIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS TypeIdentifier # readList :: ReadS [TypeIdentifier] # | |
Show TypeIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TypeIdentifier -> ShowS # show :: TypeIdentifier -> String # showList :: [TypeIdentifier] -> ShowS # | |
Eq TypeIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TypeIdentifier -> TypeIdentifier -> Bool # (/=) :: TypeIdentifier -> TypeIdentifier -> Bool # | |
Ord TypeIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TypeIdentifier -> TypeIdentifier -> Ordering # (<) :: TypeIdentifier -> TypeIdentifier -> Bool # (<=) :: TypeIdentifier -> TypeIdentifier -> Bool # (>) :: TypeIdentifier -> TypeIdentifier -> Bool # (>=) :: TypeIdentifier -> TypeIdentifier -> Bool # max :: TypeIdentifier -> TypeIdentifier -> TypeIdentifier # min :: TypeIdentifier -> TypeIdentifier -> TypeIdentifier # |
LiteralNull | |
LiteralInteger IntegerLiteral | |
LiteralFloatingPoint FloatingPointLiteral | |
LiteralBoolean Bool | |
LiteralCharacter Int | |
LiteralString StringLiteral |
newtype IntegerLiteral Source #
Note: this is an approximation which ignores encoding
IntegerLiteral | |
|
Instances
Read IntegerLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS IntegerLiteral # readList :: ReadS [IntegerLiteral] # | |
Show IntegerLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> IntegerLiteral -> ShowS # show :: IntegerLiteral -> String # showList :: [IntegerLiteral] -> ShowS # | |
Eq IntegerLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: IntegerLiteral -> IntegerLiteral -> Bool # (/=) :: IntegerLiteral -> IntegerLiteral -> Bool # | |
Ord IntegerLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: IntegerLiteral -> IntegerLiteral -> Ordering # (<) :: IntegerLiteral -> IntegerLiteral -> Bool # (<=) :: IntegerLiteral -> IntegerLiteral -> Bool # (>) :: IntegerLiteral -> IntegerLiteral -> Bool # (>=) :: IntegerLiteral -> IntegerLiteral -> Bool # max :: IntegerLiteral -> IntegerLiteral -> IntegerLiteral # min :: IntegerLiteral -> IntegerLiteral -> IntegerLiteral # |
newtype FloatingPointLiteral Source #
Note: this is an approximation which ignores encoding
FloatingPointLiteral | |
|
Instances
newtype StringLiteral Source #
Note: this is an approximation which ignores encoding
StringLiteral | |
|
Instances
Read StringLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS StringLiteral # readList :: ReadS [StringLiteral] # | |
Show StringLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> StringLiteral -> ShowS # show :: StringLiteral -> String # showList :: [StringLiteral] -> ShowS # | |
Eq StringLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: StringLiteral -> StringLiteral -> Bool # (/=) :: StringLiteral -> StringLiteral -> Bool # | |
Ord StringLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: StringLiteral -> StringLiteral -> Ordering # (<) :: StringLiteral -> StringLiteral -> Bool # (<=) :: StringLiteral -> StringLiteral -> Bool # (>) :: StringLiteral -> StringLiteral -> Bool # (>=) :: StringLiteral -> StringLiteral -> Bool # max :: StringLiteral -> StringLiteral -> StringLiteral # min :: StringLiteral -> StringLiteral -> StringLiteral # |
data PrimitiveTypeWithAnnotations Source #
Instances
data PrimitiveType Source #
Instances
Read PrimitiveType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS PrimitiveType # readList :: ReadS [PrimitiveType] # | |
Show PrimitiveType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PrimitiveType -> ShowS # show :: PrimitiveType -> String # showList :: [PrimitiveType] -> ShowS # | |
Eq PrimitiveType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PrimitiveType -> PrimitiveType -> Bool # (/=) :: PrimitiveType -> PrimitiveType -> Bool # | |
Ord PrimitiveType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PrimitiveType -> PrimitiveType -> Ordering # (<) :: PrimitiveType -> PrimitiveType -> Bool # (<=) :: PrimitiveType -> PrimitiveType -> Bool # (>) :: PrimitiveType -> PrimitiveType -> Bool # (>=) :: PrimitiveType -> PrimitiveType -> Bool # max :: PrimitiveType -> PrimitiveType -> PrimitiveType # min :: PrimitiveType -> PrimitiveType -> PrimitiveType # |
data NumericType Source #
Instances
Read NumericType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS NumericType # readList :: ReadS [NumericType] # readPrec :: ReadPrec NumericType # readListPrec :: ReadPrec [NumericType] # | |
Show NumericType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> NumericType -> ShowS # show :: NumericType -> String # showList :: [NumericType] -> ShowS # | |
Eq NumericType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: NumericType -> NumericType -> Bool # (/=) :: NumericType -> NumericType -> Bool # | |
Ord NumericType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: NumericType -> NumericType -> Ordering # (<) :: NumericType -> NumericType -> Bool # (<=) :: NumericType -> NumericType -> Bool # (>) :: NumericType -> NumericType -> Bool # (>=) :: NumericType -> NumericType -> Bool # max :: NumericType -> NumericType -> NumericType # min :: NumericType -> NumericType -> NumericType # |
_NumericType :: Name Source #
data IntegralType Source #
Instances
Read IntegralType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS IntegralType # readList :: ReadS [IntegralType] # | |
Show IntegralType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> IntegralType -> ShowS # show :: IntegralType -> String # showList :: [IntegralType] -> ShowS # | |
Eq IntegralType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: IntegralType -> IntegralType -> Bool # (/=) :: IntegralType -> IntegralType -> Bool # | |
Ord IntegralType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: IntegralType -> IntegralType -> Ordering # (<) :: IntegralType -> IntegralType -> Bool # (<=) :: IntegralType -> IntegralType -> Bool # (>) :: IntegralType -> IntegralType -> Bool # (>=) :: IntegralType -> IntegralType -> Bool # max :: IntegralType -> IntegralType -> IntegralType # min :: IntegralType -> IntegralType -> IntegralType # |
_IntegralType :: Name Source #
data FloatingPointType Source #
Instances
Read FloatingPointType Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show FloatingPointType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> FloatingPointType -> ShowS # show :: FloatingPointType -> String # showList :: [FloatingPointType] -> ShowS # | |
Eq FloatingPointType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: FloatingPointType -> FloatingPointType -> Bool # (/=) :: FloatingPointType -> FloatingPointType -> Bool # | |
Ord FloatingPointType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: FloatingPointType -> FloatingPointType -> Ordering # (<) :: FloatingPointType -> FloatingPointType -> Bool # (<=) :: FloatingPointType -> FloatingPointType -> Bool # (>) :: FloatingPointType -> FloatingPointType -> Bool # (>=) :: FloatingPointType -> FloatingPointType -> Bool # max :: FloatingPointType -> FloatingPointType -> FloatingPointType # min :: FloatingPointType -> FloatingPointType -> FloatingPointType # |
data ReferenceType Source #
ReferenceTypeClassOrInterface ClassOrInterfaceType | |
ReferenceTypeVariable TypeVariable | |
ReferenceTypeArray ArrayType |
Instances
Read ReferenceType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ReferenceType # readList :: ReadS [ReferenceType] # | |
Show ReferenceType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ReferenceType -> ShowS # show :: ReferenceType -> String # showList :: [ReferenceType] -> ShowS # | |
Eq ReferenceType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ReferenceType -> ReferenceType -> Bool # (/=) :: ReferenceType -> ReferenceType -> Bool # | |
Ord ReferenceType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ReferenceType -> ReferenceType -> Ordering # (<) :: ReferenceType -> ReferenceType -> Bool # (<=) :: ReferenceType -> ReferenceType -> Bool # (>) :: ReferenceType -> ReferenceType -> Bool # (>=) :: ReferenceType -> ReferenceType -> Bool # max :: ReferenceType -> ReferenceType -> ReferenceType # min :: ReferenceType -> ReferenceType -> ReferenceType # |
data ClassOrInterfaceType Source #
Instances
_ClassType :: Name Source #
data ClassTypeQualifier Source #
ClassTypeQualifierNone | |
ClassTypeQualifierPackage PackageName | |
ClassTypeQualifierParent ClassOrInterfaceType |
Instances
Read ClassTypeQualifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ClassTypeQualifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ClassTypeQualifier -> ShowS # show :: ClassTypeQualifier -> String # showList :: [ClassTypeQualifier] -> ShowS # | |
Eq ClassTypeQualifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ClassTypeQualifier -> ClassTypeQualifier -> Bool # (/=) :: ClassTypeQualifier -> ClassTypeQualifier -> Bool # | |
Ord ClassTypeQualifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ClassTypeQualifier -> ClassTypeQualifier -> Ordering # (<) :: ClassTypeQualifier -> ClassTypeQualifier -> Bool # (<=) :: ClassTypeQualifier -> ClassTypeQualifier -> Bool # (>) :: ClassTypeQualifier -> ClassTypeQualifier -> Bool # (>=) :: ClassTypeQualifier -> ClassTypeQualifier -> Bool # max :: ClassTypeQualifier -> ClassTypeQualifier -> ClassTypeQualifier # min :: ClassTypeQualifier -> ClassTypeQualifier -> ClassTypeQualifier # |
newtype InterfaceType Source #
Instances
Read InterfaceType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS InterfaceType # readList :: ReadS [InterfaceType] # | |
Show InterfaceType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> InterfaceType -> ShowS # show :: InterfaceType -> String # showList :: [InterfaceType] -> ShowS # | |
Eq InterfaceType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: InterfaceType -> InterfaceType -> Bool # (/=) :: InterfaceType -> InterfaceType -> Bool # | |
Ord InterfaceType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: InterfaceType -> InterfaceType -> Ordering # (<) :: InterfaceType -> InterfaceType -> Bool # (<=) :: InterfaceType -> InterfaceType -> Bool # (>) :: InterfaceType -> InterfaceType -> Bool # (>=) :: InterfaceType -> InterfaceType -> Bool # max :: InterfaceType -> InterfaceType -> InterfaceType # min :: InterfaceType -> InterfaceType -> InterfaceType # |
data TypeVariable Source #
Instances
Read TypeVariable Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS TypeVariable # readList :: ReadS [TypeVariable] # | |
Show TypeVariable Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TypeVariable -> ShowS # show :: TypeVariable -> String # showList :: [TypeVariable] -> ShowS # | |
Eq TypeVariable Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TypeVariable -> TypeVariable -> Bool # (/=) :: TypeVariable -> TypeVariable -> Bool # | |
Ord TypeVariable Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TypeVariable -> TypeVariable -> Ordering # (<) :: TypeVariable -> TypeVariable -> Bool # (<=) :: TypeVariable -> TypeVariable -> Bool # (>) :: TypeVariable -> TypeVariable -> Bool # (>=) :: TypeVariable -> TypeVariable -> Bool # max :: TypeVariable -> TypeVariable -> TypeVariable # min :: TypeVariable -> TypeVariable -> TypeVariable # |
_TypeVariable :: Name Source #
_ArrayType :: Name Source #
data ArrayType_Variant Source #
ArrayType_VariantPrimitive PrimitiveTypeWithAnnotations | |
ArrayType_VariantClassOrInterface ClassOrInterfaceType | |
ArrayType_VariantVariable TypeVariable |
Instances
Read ArrayType_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ArrayType_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ArrayType_Variant -> ShowS # show :: ArrayType_Variant -> String # showList :: [ArrayType_Variant] -> ShowS # | |
Eq ArrayType_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ArrayType_Variant -> ArrayType_Variant -> Bool # (/=) :: ArrayType_Variant -> ArrayType_Variant -> Bool # | |
Ord ArrayType_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ArrayType_Variant -> ArrayType_Variant -> Ordering # (<) :: ArrayType_Variant -> ArrayType_Variant -> Bool # (<=) :: ArrayType_Variant -> ArrayType_Variant -> Bool # (>) :: ArrayType_Variant -> ArrayType_Variant -> Bool # (>=) :: ArrayType_Variant -> ArrayType_Variant -> Bool # max :: ArrayType_Variant -> ArrayType_Variant -> ArrayType_Variant # min :: ArrayType_Variant -> ArrayType_Variant -> ArrayType_Variant # |
Dims | |
|
data TypeParameter Source #
Instances
Read TypeParameter Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS TypeParameter # readList :: ReadS [TypeParameter] # | |
Show TypeParameter Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TypeParameter -> ShowS # show :: TypeParameter -> String # showList :: [TypeParameter] -> ShowS # | |
Eq TypeParameter Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TypeParameter -> TypeParameter -> Bool # (/=) :: TypeParameter -> TypeParameter -> Bool # | |
Ord TypeParameter Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TypeParameter -> TypeParameter -> Ordering # (<) :: TypeParameter -> TypeParameter -> Bool # (<=) :: TypeParameter -> TypeParameter -> Bool # (>) :: TypeParameter -> TypeParameter -> Bool # (>=) :: TypeParameter -> TypeParameter -> Bool # max :: TypeParameter -> TypeParameter -> TypeParameter # min :: TypeParameter -> TypeParameter -> TypeParameter # |
newtype TypeParameterModifier Source #
Instances
_TypeBound :: Name Source #
data TypeBound_ClassOrInterface Source #
Instances
newtype AdditionalBound Source #
Instances
Read AdditionalBound Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show AdditionalBound Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AdditionalBound -> ShowS # show :: AdditionalBound -> String # showList :: [AdditionalBound] -> ShowS # | |
Eq AdditionalBound Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AdditionalBound -> AdditionalBound -> Bool # (/=) :: AdditionalBound -> AdditionalBound -> Bool # | |
Ord AdditionalBound Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AdditionalBound -> AdditionalBound -> Ordering # (<) :: AdditionalBound -> AdditionalBound -> Bool # (<=) :: AdditionalBound -> AdditionalBound -> Bool # (>) :: AdditionalBound -> AdditionalBound -> Bool # (>=) :: AdditionalBound -> AdditionalBound -> Bool # max :: AdditionalBound -> AdditionalBound -> AdditionalBound # min :: AdditionalBound -> AdditionalBound -> AdditionalBound # |
data TypeArgument Source #
Instances
Read TypeArgument Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS TypeArgument # readList :: ReadS [TypeArgument] # | |
Show TypeArgument Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TypeArgument -> ShowS # show :: TypeArgument -> String # showList :: [TypeArgument] -> ShowS # | |
Eq TypeArgument Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TypeArgument -> TypeArgument -> Bool # (/=) :: TypeArgument -> TypeArgument -> Bool # | |
Ord TypeArgument Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TypeArgument -> TypeArgument -> Ordering # (<) :: TypeArgument -> TypeArgument -> Bool # (<=) :: TypeArgument -> TypeArgument -> Bool # (>) :: TypeArgument -> TypeArgument -> Bool # (>=) :: TypeArgument -> TypeArgument -> Bool # max :: TypeArgument -> TypeArgument -> TypeArgument # min :: TypeArgument -> TypeArgument -> TypeArgument # |
_TypeArgument :: Name Source #
data WildcardBounds Source #
Instances
Read WildcardBounds Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS WildcardBounds # readList :: ReadS [WildcardBounds] # | |
Show WildcardBounds Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> WildcardBounds -> ShowS # show :: WildcardBounds -> String # showList :: [WildcardBounds] -> ShowS # | |
Eq WildcardBounds Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: WildcardBounds -> WildcardBounds -> Bool # (/=) :: WildcardBounds -> WildcardBounds -> Bool # | |
Ord WildcardBounds Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: WildcardBounds -> WildcardBounds -> Ordering # (<) :: WildcardBounds -> WildcardBounds -> Bool # (<=) :: WildcardBounds -> WildcardBounds -> Bool # (>) :: WildcardBounds -> WildcardBounds -> Bool # (>=) :: WildcardBounds -> WildcardBounds -> Bool # max :: WildcardBounds -> WildcardBounds -> WildcardBounds # min :: WildcardBounds -> WildcardBounds -> WildcardBounds # |
data ModuleName Source #
Instances
Read ModuleName Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ModuleName # readList :: ReadS [ModuleName] # readPrec :: ReadPrec ModuleName # readListPrec :: ReadPrec [ModuleName] # | |
Show ModuleName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ModuleName -> ShowS # show :: ModuleName -> String # showList :: [ModuleName] -> ShowS # | |
Eq ModuleName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ModuleName -> ModuleName -> Bool # (/=) :: ModuleName -> ModuleName -> Bool # | |
Ord ModuleName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ModuleName -> ModuleName -> Ordering # (<) :: ModuleName -> ModuleName -> Bool # (<=) :: ModuleName -> ModuleName -> Bool # (>) :: ModuleName -> ModuleName -> Bool # (>=) :: ModuleName -> ModuleName -> Bool # max :: ModuleName -> ModuleName -> ModuleName # min :: ModuleName -> ModuleName -> ModuleName # |
_ModuleName :: Name Source #
newtype PackageName Source #
Instances
Read PackageName Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS PackageName # readList :: ReadS [PackageName] # readPrec :: ReadPrec PackageName # readListPrec :: ReadPrec [PackageName] # | |
Show PackageName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PackageName -> ShowS # show :: PackageName -> String # showList :: [PackageName] -> ShowS # | |
Eq PackageName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PackageName -> PackageName -> Bool # (/=) :: PackageName -> PackageName -> Bool # | |
Ord PackageName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PackageName -> PackageName -> Ordering # (<) :: PackageName -> PackageName -> Bool # (<=) :: PackageName -> PackageName -> Bool # (>) :: PackageName -> PackageName -> Bool # (>=) :: PackageName -> PackageName -> Bool # max :: PackageName -> PackageName -> PackageName # min :: PackageName -> PackageName -> PackageName # |
_PackageName :: Name Source #
data ExpressionName Source #
Instances
Read ExpressionName Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ExpressionName # readList :: ReadS [ExpressionName] # | |
Show ExpressionName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ExpressionName -> ShowS # show :: ExpressionName -> String # showList :: [ExpressionName] -> ShowS # | |
Eq ExpressionName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ExpressionName -> ExpressionName -> Bool # (/=) :: ExpressionName -> ExpressionName -> Bool # | |
Ord ExpressionName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ExpressionName -> ExpressionName -> Ordering # (<) :: ExpressionName -> ExpressionName -> Bool # (<=) :: ExpressionName -> ExpressionName -> Bool # (>) :: ExpressionName -> ExpressionName -> Bool # (>=) :: ExpressionName -> ExpressionName -> Bool # max :: ExpressionName -> ExpressionName -> ExpressionName # min :: ExpressionName -> ExpressionName -> ExpressionName # |
newtype MethodName Source #
Instances
Read MethodName Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS MethodName # readList :: ReadS [MethodName] # readPrec :: ReadPrec MethodName # readListPrec :: ReadPrec [MethodName] # | |
Show MethodName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodName -> ShowS # show :: MethodName -> String # showList :: [MethodName] -> ShowS # | |
Eq MethodName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodName -> MethodName -> Bool # (/=) :: MethodName -> MethodName -> Bool # | |
Ord MethodName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodName -> MethodName -> Ordering # (<) :: MethodName -> MethodName -> Bool # (<=) :: MethodName -> MethodName -> Bool # (>) :: MethodName -> MethodName -> Bool # (>=) :: MethodName -> MethodName -> Bool # max :: MethodName -> MethodName -> MethodName # min :: MethodName -> MethodName -> MethodName # |
_MethodName :: Name Source #
newtype PackageOrTypeName Source #
Instances
Read PackageOrTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show PackageOrTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PackageOrTypeName -> ShowS # show :: PackageOrTypeName -> String # showList :: [PackageOrTypeName] -> ShowS # | |
Eq PackageOrTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PackageOrTypeName -> PackageOrTypeName -> Bool # (/=) :: PackageOrTypeName -> PackageOrTypeName -> Bool # | |
Ord PackageOrTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PackageOrTypeName -> PackageOrTypeName -> Ordering # (<) :: PackageOrTypeName -> PackageOrTypeName -> Bool # (<=) :: PackageOrTypeName -> PackageOrTypeName -> Bool # (>) :: PackageOrTypeName -> PackageOrTypeName -> Bool # (>=) :: PackageOrTypeName -> PackageOrTypeName -> Bool # max :: PackageOrTypeName -> PackageOrTypeName -> PackageOrTypeName # min :: PackageOrTypeName -> PackageOrTypeName -> PackageOrTypeName # |
newtype AmbiguousName Source #
Instances
Read AmbiguousName Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS AmbiguousName # readList :: ReadS [AmbiguousName] # | |
Show AmbiguousName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AmbiguousName -> ShowS # show :: AmbiguousName -> String # showList :: [AmbiguousName] -> ShowS # | |
Eq AmbiguousName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AmbiguousName -> AmbiguousName -> Bool # (/=) :: AmbiguousName -> AmbiguousName -> Bool # | |
Ord AmbiguousName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AmbiguousName -> AmbiguousName -> Ordering # (<) :: AmbiguousName -> AmbiguousName -> Bool # (<=) :: AmbiguousName -> AmbiguousName -> Bool # (>) :: AmbiguousName -> AmbiguousName -> Bool # (>=) :: AmbiguousName -> AmbiguousName -> Bool # max :: AmbiguousName -> AmbiguousName -> AmbiguousName # min :: AmbiguousName -> AmbiguousName -> AmbiguousName # |
data CompilationUnit Source #
Instances
Read CompilationUnit Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show CompilationUnit Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> CompilationUnit -> ShowS # show :: CompilationUnit -> String # showList :: [CompilationUnit] -> ShowS # | |
Eq CompilationUnit Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: CompilationUnit -> CompilationUnit -> Bool # (/=) :: CompilationUnit -> CompilationUnit -> Bool # | |
Ord CompilationUnit Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: CompilationUnit -> CompilationUnit -> Ordering # (<) :: CompilationUnit -> CompilationUnit -> Bool # (<=) :: CompilationUnit -> CompilationUnit -> Bool # (>) :: CompilationUnit -> CompilationUnit -> Bool # (>=) :: CompilationUnit -> CompilationUnit -> Bool # max :: CompilationUnit -> CompilationUnit -> CompilationUnit # min :: CompilationUnit -> CompilationUnit -> CompilationUnit # |
data OrdinaryCompilationUnit Source #
Instances
data ModularCompilationUnit Source #
Instances
data PackageDeclaration Source #
Instances
Read PackageDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show PackageDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PackageDeclaration -> ShowS # show :: PackageDeclaration -> String # showList :: [PackageDeclaration] -> ShowS # | |
Eq PackageDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PackageDeclaration -> PackageDeclaration -> Bool # (/=) :: PackageDeclaration -> PackageDeclaration -> Bool # | |
Ord PackageDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PackageDeclaration -> PackageDeclaration -> Ordering # (<) :: PackageDeclaration -> PackageDeclaration -> Bool # (<=) :: PackageDeclaration -> PackageDeclaration -> Bool # (>) :: PackageDeclaration -> PackageDeclaration -> Bool # (>=) :: PackageDeclaration -> PackageDeclaration -> Bool # max :: PackageDeclaration -> PackageDeclaration -> PackageDeclaration # min :: PackageDeclaration -> PackageDeclaration -> PackageDeclaration # |
newtype PackageModifier Source #
Instances
Read PackageModifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show PackageModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PackageModifier -> ShowS # show :: PackageModifier -> String # showList :: [PackageModifier] -> ShowS # | |
Eq PackageModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PackageModifier -> PackageModifier -> Bool # (/=) :: PackageModifier -> PackageModifier -> Bool # | |
Ord PackageModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PackageModifier -> PackageModifier -> Ordering # (<) :: PackageModifier -> PackageModifier -> Bool # (<=) :: PackageModifier -> PackageModifier -> Bool # (>) :: PackageModifier -> PackageModifier -> Bool # (>=) :: PackageModifier -> PackageModifier -> Bool # max :: PackageModifier -> PackageModifier -> PackageModifier # min :: PackageModifier -> PackageModifier -> PackageModifier # |
data ImportDeclaration Source #
Instances
Read ImportDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ImportDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ImportDeclaration -> ShowS # show :: ImportDeclaration -> String # showList :: [ImportDeclaration] -> ShowS # | |
Eq ImportDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ImportDeclaration -> ImportDeclaration -> Bool # (/=) :: ImportDeclaration -> ImportDeclaration -> Bool # | |
Ord ImportDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ImportDeclaration -> ImportDeclaration -> Ordering # (<) :: ImportDeclaration -> ImportDeclaration -> Bool # (<=) :: ImportDeclaration -> ImportDeclaration -> Bool # (>) :: ImportDeclaration -> ImportDeclaration -> Bool # (>=) :: ImportDeclaration -> ImportDeclaration -> Bool # max :: ImportDeclaration -> ImportDeclaration -> ImportDeclaration # min :: ImportDeclaration -> ImportDeclaration -> ImportDeclaration # |
newtype SingleTypeImportDeclaration Source #
Instances
newtype TypeImportOnDemandDeclaration Source #
Instances
data SingleStaticImportDeclaration Source #
Instances
newtype StaticImportOnDemandDeclaration Source #
Instances
data TypeDeclaration Source #
TypeDeclarationClass ClassDeclaration | |
TypeDeclarationInterface InterfaceDeclaration | |
TypeDeclarationNone |
Instances
Read TypeDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show TypeDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TypeDeclaration -> ShowS # show :: TypeDeclaration -> String # showList :: [TypeDeclaration] -> ShowS # | |
Eq TypeDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TypeDeclaration -> TypeDeclaration -> Bool # (/=) :: TypeDeclaration -> TypeDeclaration -> Bool # | |
Ord TypeDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TypeDeclaration -> TypeDeclaration -> Ordering # (<) :: TypeDeclaration -> TypeDeclaration -> Bool # (<=) :: TypeDeclaration -> TypeDeclaration -> Bool # (>) :: TypeDeclaration -> TypeDeclaration -> Bool # (>=) :: TypeDeclaration -> TypeDeclaration -> Bool # max :: TypeDeclaration -> TypeDeclaration -> TypeDeclaration # min :: TypeDeclaration -> TypeDeclaration -> TypeDeclaration # |
data TypeDeclarationWithComments Source #
Instances
data ModuleDeclaration Source #
Instances
Read ModuleDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ModuleDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ModuleDeclaration -> ShowS # show :: ModuleDeclaration -> String # showList :: [ModuleDeclaration] -> ShowS # | |
Eq ModuleDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ModuleDeclaration -> ModuleDeclaration -> Bool # (/=) :: ModuleDeclaration -> ModuleDeclaration -> Bool # | |
Ord ModuleDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ModuleDeclaration -> ModuleDeclaration -> Ordering # (<) :: ModuleDeclaration -> ModuleDeclaration -> Bool # (<=) :: ModuleDeclaration -> ModuleDeclaration -> Bool # (>) :: ModuleDeclaration -> ModuleDeclaration -> Bool # (>=) :: ModuleDeclaration -> ModuleDeclaration -> Bool # max :: ModuleDeclaration -> ModuleDeclaration -> ModuleDeclaration # min :: ModuleDeclaration -> ModuleDeclaration -> ModuleDeclaration # |
data ModuleDirective Source #
Instances
Read ModuleDirective Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ModuleDirective Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ModuleDirective -> ShowS # show :: ModuleDirective -> String # showList :: [ModuleDirective] -> ShowS # | |
Eq ModuleDirective Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ModuleDirective -> ModuleDirective -> Bool # (/=) :: ModuleDirective -> ModuleDirective -> Bool # | |
Ord ModuleDirective Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ModuleDirective -> ModuleDirective -> Ordering # (<) :: ModuleDirective -> ModuleDirective -> Bool # (<=) :: ModuleDirective -> ModuleDirective -> Bool # (>) :: ModuleDirective -> ModuleDirective -> Bool # (>=) :: ModuleDirective -> ModuleDirective -> Bool # max :: ModuleDirective -> ModuleDirective -> ModuleDirective # min :: ModuleDirective -> ModuleDirective -> ModuleDirective # |
data ModuleDirective_Requires Source #
Instances
data ModuleDirective_ExportsOrOpens Source #
ModuleDirective_ExportsOrOpens | |
|
Instances
data ModuleDirective_Provides Source #
ModuleDirective_Provides | |
|
Instances
data RequiresModifier Source #
Instances
Read RequiresModifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show RequiresModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> RequiresModifier -> ShowS # show :: RequiresModifier -> String # showList :: [RequiresModifier] -> ShowS # | |
Eq RequiresModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: RequiresModifier -> RequiresModifier -> Bool # (/=) :: RequiresModifier -> RequiresModifier -> Bool # | |
Ord RequiresModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: RequiresModifier -> RequiresModifier -> Ordering # (<) :: RequiresModifier -> RequiresModifier -> Bool # (<=) :: RequiresModifier -> RequiresModifier -> Bool # (>) :: RequiresModifier -> RequiresModifier -> Bool # (>=) :: RequiresModifier -> RequiresModifier -> Bool # max :: RequiresModifier -> RequiresModifier -> RequiresModifier # min :: RequiresModifier -> RequiresModifier -> RequiresModifier # |
data ClassDeclaration Source #
Instances
Read ClassDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ClassDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ClassDeclaration -> ShowS # show :: ClassDeclaration -> String # showList :: [ClassDeclaration] -> ShowS # | |
Eq ClassDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ClassDeclaration -> ClassDeclaration -> Bool # (/=) :: ClassDeclaration -> ClassDeclaration -> Bool # | |
Ord ClassDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ClassDeclaration -> ClassDeclaration -> Ordering # (<) :: ClassDeclaration -> ClassDeclaration -> Bool # (<=) :: ClassDeclaration -> ClassDeclaration -> Bool # (>) :: ClassDeclaration -> ClassDeclaration -> Bool # (>=) :: ClassDeclaration -> ClassDeclaration -> Bool # max :: ClassDeclaration -> ClassDeclaration -> ClassDeclaration # min :: ClassDeclaration -> ClassDeclaration -> ClassDeclaration # |
data NormalClassDeclaration Source #
Instances
data ClassModifier Source #
ClassModifierAnnotation Annotation | |
ClassModifierPublic | |
ClassModifierProtected | |
ClassModifierPrivate | |
ClassModifierAbstract | |
ClassModifierStatic | |
ClassModifierFinal | |
ClassModifierStrictfp |
Instances
Read ClassModifier Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ClassModifier # readList :: ReadS [ClassModifier] # | |
Show ClassModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ClassModifier -> ShowS # show :: ClassModifier -> String # showList :: [ClassModifier] -> ShowS # | |
Eq ClassModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ClassModifier -> ClassModifier -> Bool # (/=) :: ClassModifier -> ClassModifier -> Bool # | |
Ord ClassModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ClassModifier -> ClassModifier -> Ordering # (<) :: ClassModifier -> ClassModifier -> Bool # (<=) :: ClassModifier -> ClassModifier -> Bool # (>) :: ClassModifier -> ClassModifier -> Bool # (>=) :: ClassModifier -> ClassModifier -> Bool # max :: ClassModifier -> ClassModifier -> ClassModifier # min :: ClassModifier -> ClassModifier -> ClassModifier # |
_ClassBody :: Name Source #
data ClassBodyDeclaration Source #
Instances
data ClassBodyDeclarationWithComments Source #
Instances
data ClassMemberDeclaration Source #
Instances
data FieldDeclaration Source #
Instances
Read FieldDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show FieldDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> FieldDeclaration -> ShowS # show :: FieldDeclaration -> String # showList :: [FieldDeclaration] -> ShowS # | |
Eq FieldDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: FieldDeclaration -> FieldDeclaration -> Bool # (/=) :: FieldDeclaration -> FieldDeclaration -> Bool # | |
Ord FieldDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: FieldDeclaration -> FieldDeclaration -> Ordering # (<) :: FieldDeclaration -> FieldDeclaration -> Bool # (<=) :: FieldDeclaration -> FieldDeclaration -> Bool # (>) :: FieldDeclaration -> FieldDeclaration -> Bool # (>=) :: FieldDeclaration -> FieldDeclaration -> Bool # max :: FieldDeclaration -> FieldDeclaration -> FieldDeclaration # min :: FieldDeclaration -> FieldDeclaration -> FieldDeclaration # |
data FieldModifier Source #
FieldModifierAnnotation Annotation | |
FieldModifierPublic | |
FieldModifierProtected | |
FieldModifierPrivate | |
FieldModifierStatic | |
FieldModifierFinal | |
FieldModifierTransient | |
FieldModifierVolatile |
Instances
Read FieldModifier Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS FieldModifier # readList :: ReadS [FieldModifier] # | |
Show FieldModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> FieldModifier -> ShowS # show :: FieldModifier -> String # showList :: [FieldModifier] -> ShowS # | |
Eq FieldModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: FieldModifier -> FieldModifier -> Bool # (/=) :: FieldModifier -> FieldModifier -> Bool # | |
Ord FieldModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: FieldModifier -> FieldModifier -> Ordering # (<) :: FieldModifier -> FieldModifier -> Bool # (<=) :: FieldModifier -> FieldModifier -> Bool # (>) :: FieldModifier -> FieldModifier -> Bool # (>=) :: FieldModifier -> FieldModifier -> Bool # max :: FieldModifier -> FieldModifier -> FieldModifier # min :: FieldModifier -> FieldModifier -> FieldModifier # |
data VariableDeclarator Source #
Instances
Read VariableDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show VariableDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> VariableDeclarator -> ShowS # show :: VariableDeclarator -> String # showList :: [VariableDeclarator] -> ShowS # | |
Eq VariableDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: VariableDeclarator -> VariableDeclarator -> Bool # (/=) :: VariableDeclarator -> VariableDeclarator -> Bool # | |
Ord VariableDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: VariableDeclarator -> VariableDeclarator -> Ordering # (<) :: VariableDeclarator -> VariableDeclarator -> Bool # (<=) :: VariableDeclarator -> VariableDeclarator -> Bool # (>) :: VariableDeclarator -> VariableDeclarator -> Bool # (>=) :: VariableDeclarator -> VariableDeclarator -> Bool # max :: VariableDeclarator -> VariableDeclarator -> VariableDeclarator # min :: VariableDeclarator -> VariableDeclarator -> VariableDeclarator # |
data VariableDeclaratorId Source #
Instances
data VariableInitializer Source #
Instances
Read VariableInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show VariableInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> VariableInitializer -> ShowS # show :: VariableInitializer -> String # showList :: [VariableInitializer] -> ShowS # | |
Eq VariableInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: VariableInitializer -> VariableInitializer -> Bool # (/=) :: VariableInitializer -> VariableInitializer -> Bool # | |
Ord VariableInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: VariableInitializer -> VariableInitializer -> Ordering # (<) :: VariableInitializer -> VariableInitializer -> Bool # (<=) :: VariableInitializer -> VariableInitializer -> Bool # (>) :: VariableInitializer -> VariableInitializer -> Bool # (>=) :: VariableInitializer -> VariableInitializer -> Bool # max :: VariableInitializer -> VariableInitializer -> VariableInitializer # min :: VariableInitializer -> VariableInitializer -> VariableInitializer # |
A Type which does not allow annotations
UnannType | |
|
_UnannType :: Name Source #
newtype UnannClassType Source #
A ClassType which does not allow annotations
UnannClassType | |
|
Instances
Read UnannClassType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS UnannClassType # readList :: ReadS [UnannClassType] # | |
Show UnannClassType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> UnannClassType -> ShowS # show :: UnannClassType -> String # showList :: [UnannClassType] -> ShowS # | |
Eq UnannClassType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: UnannClassType -> UnannClassType -> Bool # (/=) :: UnannClassType -> UnannClassType -> Bool # | |
Ord UnannClassType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: UnannClassType -> UnannClassType -> Ordering # (<) :: UnannClassType -> UnannClassType -> Bool # (<=) :: UnannClassType -> UnannClassType -> Bool # (>) :: UnannClassType -> UnannClassType -> Bool # (>=) :: UnannClassType -> UnannClassType -> Bool # max :: UnannClassType -> UnannClassType -> UnannClassType # min :: UnannClassType -> UnannClassType -> UnannClassType # |
data MethodDeclaration Source #
MethodDeclaration | |
|
Instances
Read MethodDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show MethodDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodDeclaration -> ShowS # show :: MethodDeclaration -> String # showList :: [MethodDeclaration] -> ShowS # | |
Eq MethodDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodDeclaration -> MethodDeclaration -> Bool # (/=) :: MethodDeclaration -> MethodDeclaration -> Bool # | |
Ord MethodDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodDeclaration -> MethodDeclaration -> Ordering # (<) :: MethodDeclaration -> MethodDeclaration -> Bool # (<=) :: MethodDeclaration -> MethodDeclaration -> Bool # (>) :: MethodDeclaration -> MethodDeclaration -> Bool # (>=) :: MethodDeclaration -> MethodDeclaration -> Bool # max :: MethodDeclaration -> MethodDeclaration -> MethodDeclaration # min :: MethodDeclaration -> MethodDeclaration -> MethodDeclaration # |
data MethodModifier Source #
Instances
Read MethodModifier Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS MethodModifier # readList :: ReadS [MethodModifier] # | |
Show MethodModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodModifier -> ShowS # show :: MethodModifier -> String # showList :: [MethodModifier] -> ShowS # | |
Eq MethodModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodModifier -> MethodModifier -> Bool # (/=) :: MethodModifier -> MethodModifier -> Bool # | |
Ord MethodModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodModifier -> MethodModifier -> Ordering # (<) :: MethodModifier -> MethodModifier -> Bool # (<=) :: MethodModifier -> MethodModifier -> Bool # (>) :: MethodModifier -> MethodModifier -> Bool # (>=) :: MethodModifier -> MethodModifier -> Bool # max :: MethodModifier -> MethodModifier -> MethodModifier # min :: MethodModifier -> MethodModifier -> MethodModifier # |
data MethodHeader Source #
Instances
Read MethodHeader Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS MethodHeader # readList :: ReadS [MethodHeader] # | |
Show MethodHeader Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodHeader -> ShowS # show :: MethodHeader -> String # showList :: [MethodHeader] -> ShowS # | |
Eq MethodHeader Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodHeader -> MethodHeader -> Bool # (/=) :: MethodHeader -> MethodHeader -> Bool # | |
Ord MethodHeader Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodHeader -> MethodHeader -> Ordering # (<) :: MethodHeader -> MethodHeader -> Bool # (<=) :: MethodHeader -> MethodHeader -> Bool # (>) :: MethodHeader -> MethodHeader -> Bool # (>=) :: MethodHeader -> MethodHeader -> Bool # max :: MethodHeader -> MethodHeader -> MethodHeader # min :: MethodHeader -> MethodHeader -> MethodHeader # |
_MethodHeader :: Name Source #
data MethodDeclarator Source #
Instances
Read MethodDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show MethodDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodDeclarator -> ShowS # show :: MethodDeclarator -> String # showList :: [MethodDeclarator] -> ShowS # | |
Eq MethodDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodDeclarator -> MethodDeclarator -> Bool # (/=) :: MethodDeclarator -> MethodDeclarator -> Bool # | |
Ord MethodDeclarator Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodDeclarator -> MethodDeclarator -> Ordering # (<) :: MethodDeclarator -> MethodDeclarator -> Bool # (<=) :: MethodDeclarator -> MethodDeclarator -> Bool # (>) :: MethodDeclarator -> MethodDeclarator -> Bool # (>=) :: MethodDeclarator -> MethodDeclarator -> Bool # max :: MethodDeclarator -> MethodDeclarator -> MethodDeclarator # min :: MethodDeclarator -> MethodDeclarator -> MethodDeclarator # |
data ReceiverParameter Source #
Instances
Read ReceiverParameter Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ReceiverParameter Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ReceiverParameter -> ShowS # show :: ReceiverParameter -> String # showList :: [ReceiverParameter] -> ShowS # | |
Eq ReceiverParameter Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ReceiverParameter -> ReceiverParameter -> Bool # (/=) :: ReceiverParameter -> ReceiverParameter -> Bool # | |
Ord ReceiverParameter Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ReceiverParameter -> ReceiverParameter -> Ordering # (<) :: ReceiverParameter -> ReceiverParameter -> Bool # (<=) :: ReceiverParameter -> ReceiverParameter -> Bool # (>) :: ReceiverParameter -> ReceiverParameter -> Bool # (>=) :: ReceiverParameter -> ReceiverParameter -> Bool # max :: ReceiverParameter -> ReceiverParameter -> ReceiverParameter # min :: ReceiverParameter -> ReceiverParameter -> ReceiverParameter # |
data FormalParameter Source #
Instances
Read FormalParameter Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show FormalParameter Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> FormalParameter -> ShowS # show :: FormalParameter -> String # showList :: [FormalParameter] -> ShowS # | |
Eq FormalParameter Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: FormalParameter -> FormalParameter -> Bool # (/=) :: FormalParameter -> FormalParameter -> Bool # | |
Ord FormalParameter Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: FormalParameter -> FormalParameter -> Ordering # (<) :: FormalParameter -> FormalParameter -> Bool # (<=) :: FormalParameter -> FormalParameter -> Bool # (>) :: FormalParameter -> FormalParameter -> Bool # (>=) :: FormalParameter -> FormalParameter -> Bool # max :: FormalParameter -> FormalParameter -> FormalParameter # min :: FormalParameter -> FormalParameter -> FormalParameter # |
data FormalParameter_Simple Source #
Instances
data VariableArityParameter Source #
Instances
data VariableModifier Source #
Instances
Read VariableModifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show VariableModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> VariableModifier -> ShowS # show :: VariableModifier -> String # showList :: [VariableModifier] -> ShowS # | |
Eq VariableModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: VariableModifier -> VariableModifier -> Bool # (/=) :: VariableModifier -> VariableModifier -> Bool # | |
Ord VariableModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: VariableModifier -> VariableModifier -> Ordering # (<) :: VariableModifier -> VariableModifier -> Bool # (<=) :: VariableModifier -> VariableModifier -> Bool # (>) :: VariableModifier -> VariableModifier -> Bool # (>=) :: VariableModifier -> VariableModifier -> Bool # max :: VariableModifier -> VariableModifier -> VariableModifier # min :: VariableModifier -> VariableModifier -> VariableModifier # |
Throws | |
|
data ExceptionType Source #
Instances
Read ExceptionType Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ExceptionType # readList :: ReadS [ExceptionType] # | |
Show ExceptionType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ExceptionType -> ShowS # show :: ExceptionType -> String # showList :: [ExceptionType] -> ShowS # | |
Eq ExceptionType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ExceptionType -> ExceptionType -> Bool # (/=) :: ExceptionType -> ExceptionType -> Bool # | |
Ord ExceptionType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ExceptionType -> ExceptionType -> Ordering # (<) :: ExceptionType -> ExceptionType -> Bool # (<=) :: ExceptionType -> ExceptionType -> Bool # (>) :: ExceptionType -> ExceptionType -> Bool # (>=) :: ExceptionType -> ExceptionType -> Bool # max :: ExceptionType -> ExceptionType -> ExceptionType # min :: ExceptionType -> ExceptionType -> ExceptionType # |
data MethodBody Source #
Instances
Read MethodBody Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS MethodBody # readList :: ReadS [MethodBody] # readPrec :: ReadPrec MethodBody # readListPrec :: ReadPrec [MethodBody] # | |
Show MethodBody Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodBody -> ShowS # show :: MethodBody -> String # showList :: [MethodBody] -> ShowS # | |
Eq MethodBody Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodBody -> MethodBody -> Bool # (/=) :: MethodBody -> MethodBody -> Bool # | |
Ord MethodBody Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodBody -> MethodBody -> Ordering # (<) :: MethodBody -> MethodBody -> Bool # (<=) :: MethodBody -> MethodBody -> Bool # (>) :: MethodBody -> MethodBody -> Bool # (>=) :: MethodBody -> MethodBody -> Bool # max :: MethodBody -> MethodBody -> MethodBody # min :: MethodBody -> MethodBody -> MethodBody # |
_MethodBody :: Name Source #
newtype InstanceInitializer Source #
Instances
Read InstanceInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show InstanceInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> InstanceInitializer -> ShowS # show :: InstanceInitializer -> String # showList :: [InstanceInitializer] -> ShowS # | |
Eq InstanceInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: InstanceInitializer -> InstanceInitializer -> Bool # (/=) :: InstanceInitializer -> InstanceInitializer -> Bool # | |
Ord InstanceInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: InstanceInitializer -> InstanceInitializer -> Ordering # (<) :: InstanceInitializer -> InstanceInitializer -> Bool # (<=) :: InstanceInitializer -> InstanceInitializer -> Bool # (>) :: InstanceInitializer -> InstanceInitializer -> Bool # (>=) :: InstanceInitializer -> InstanceInitializer -> Bool # max :: InstanceInitializer -> InstanceInitializer -> InstanceInitializer # min :: InstanceInitializer -> InstanceInitializer -> InstanceInitializer # |
newtype StaticInitializer Source #
Instances
Read StaticInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show StaticInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> StaticInitializer -> ShowS # show :: StaticInitializer -> String # showList :: [StaticInitializer] -> ShowS # | |
Eq StaticInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: StaticInitializer -> StaticInitializer -> Bool # (/=) :: StaticInitializer -> StaticInitializer -> Bool # | |
Ord StaticInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: StaticInitializer -> StaticInitializer -> Ordering # (<) :: StaticInitializer -> StaticInitializer -> Bool # (<=) :: StaticInitializer -> StaticInitializer -> Bool # (>) :: StaticInitializer -> StaticInitializer -> Bool # (>=) :: StaticInitializer -> StaticInitializer -> Bool # max :: StaticInitializer -> StaticInitializer -> StaticInitializer # min :: StaticInitializer -> StaticInitializer -> StaticInitializer # |
data ConstructorDeclaration Source #
Instances
data ConstructorModifier Source #
ConstructorModifierAnnotation Annotation | |
ConstructorModifierPublic | |
ConstructorModifierProtected | |
ConstructorModifierPrivate |
Instances
Read ConstructorModifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ConstructorModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ConstructorModifier -> ShowS # show :: ConstructorModifier -> String # showList :: [ConstructorModifier] -> ShowS # | |
Eq ConstructorModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ConstructorModifier -> ConstructorModifier -> Bool # (/=) :: ConstructorModifier -> ConstructorModifier -> Bool # | |
Ord ConstructorModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ConstructorModifier -> ConstructorModifier -> Ordering # (<) :: ConstructorModifier -> ConstructorModifier -> Bool # (<=) :: ConstructorModifier -> ConstructorModifier -> Bool # (>) :: ConstructorModifier -> ConstructorModifier -> Bool # (>=) :: ConstructorModifier -> ConstructorModifier -> Bool # max :: ConstructorModifier -> ConstructorModifier -> ConstructorModifier # min :: ConstructorModifier -> ConstructorModifier -> ConstructorModifier # |
data ConstructorDeclarator Source #
Instances
newtype SimpleTypeName Source #
Instances
Read SimpleTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS SimpleTypeName # readList :: ReadS [SimpleTypeName] # | |
Show SimpleTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> SimpleTypeName -> ShowS # show :: SimpleTypeName -> String # showList :: [SimpleTypeName] -> ShowS # | |
Eq SimpleTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: SimpleTypeName -> SimpleTypeName -> Bool # (/=) :: SimpleTypeName -> SimpleTypeName -> Bool # | |
Ord SimpleTypeName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: SimpleTypeName -> SimpleTypeName -> Ordering # (<) :: SimpleTypeName -> SimpleTypeName -> Bool # (<=) :: SimpleTypeName -> SimpleTypeName -> Bool # (>) :: SimpleTypeName -> SimpleTypeName -> Bool # (>=) :: SimpleTypeName -> SimpleTypeName -> Bool # max :: SimpleTypeName -> SimpleTypeName -> SimpleTypeName # min :: SimpleTypeName -> SimpleTypeName -> SimpleTypeName # |
data ConstructorBody Source #
Instances
Read ConstructorBody Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ConstructorBody Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ConstructorBody -> ShowS # show :: ConstructorBody -> String # showList :: [ConstructorBody] -> ShowS # | |
Eq ConstructorBody Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ConstructorBody -> ConstructorBody -> Bool # (/=) :: ConstructorBody -> ConstructorBody -> Bool # | |
Ord ConstructorBody Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ConstructorBody -> ConstructorBody -> Ordering # (<) :: ConstructorBody -> ConstructorBody -> Bool # (<=) :: ConstructorBody -> ConstructorBody -> Bool # (>) :: ConstructorBody -> ConstructorBody -> Bool # (>=) :: ConstructorBody -> ConstructorBody -> Bool # max :: ConstructorBody -> ConstructorBody -> ConstructorBody # min :: ConstructorBody -> ConstructorBody -> ConstructorBody # |
data ExplicitConstructorInvocation Source #
Instances
data ExplicitConstructorInvocation_Variant Source #
ExplicitConstructorInvocation_VariantThis | |
ExplicitConstructorInvocation_VariantSuper (Maybe ExpressionName) | |
ExplicitConstructorInvocation_VariantPrimary Primary |
Instances
data EnumDeclaration Source #
Instances
Read EnumDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show EnumDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EnumDeclaration -> ShowS # show :: EnumDeclaration -> String # showList :: [EnumDeclaration] -> ShowS # | |
Eq EnumDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EnumDeclaration -> EnumDeclaration -> Bool # (/=) :: EnumDeclaration -> EnumDeclaration -> Bool # | |
Ord EnumDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EnumDeclaration -> EnumDeclaration -> Ordering # (<) :: EnumDeclaration -> EnumDeclaration -> Bool # (<=) :: EnumDeclaration -> EnumDeclaration -> Bool # (>) :: EnumDeclaration -> EnumDeclaration -> Bool # (>=) :: EnumDeclaration -> EnumDeclaration -> Bool # max :: EnumDeclaration -> EnumDeclaration -> EnumDeclaration # min :: EnumDeclaration -> EnumDeclaration -> EnumDeclaration # |
data EnumBody_Element Source #
Instances
Read EnumBody_Element Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show EnumBody_Element Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EnumBody_Element -> ShowS # show :: EnumBody_Element -> String # showList :: [EnumBody_Element] -> ShowS # | |
Eq EnumBody_Element Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EnumBody_Element -> EnumBody_Element -> Bool # (/=) :: EnumBody_Element -> EnumBody_Element -> Bool # | |
Ord EnumBody_Element Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EnumBody_Element -> EnumBody_Element -> Ordering # (<) :: EnumBody_Element -> EnumBody_Element -> Bool # (<=) :: EnumBody_Element -> EnumBody_Element -> Bool # (>) :: EnumBody_Element -> EnumBody_Element -> Bool # (>=) :: EnumBody_Element -> EnumBody_Element -> Bool # max :: EnumBody_Element -> EnumBody_Element -> EnumBody_Element # min :: EnumBody_Element -> EnumBody_Element -> EnumBody_Element # |
data EnumConstant Source #
Instances
Read EnumConstant Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS EnumConstant # readList :: ReadS [EnumConstant] # | |
Show EnumConstant Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EnumConstant -> ShowS # show :: EnumConstant -> String # showList :: [EnumConstant] -> ShowS # | |
Eq EnumConstant Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EnumConstant -> EnumConstant -> Bool # (/=) :: EnumConstant -> EnumConstant -> Bool # | |
Ord EnumConstant Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EnumConstant -> EnumConstant -> Ordering # (<) :: EnumConstant -> EnumConstant -> Bool # (<=) :: EnumConstant -> EnumConstant -> Bool # (>) :: EnumConstant -> EnumConstant -> Bool # (>=) :: EnumConstant -> EnumConstant -> Bool # max :: EnumConstant -> EnumConstant -> EnumConstant # min :: EnumConstant -> EnumConstant -> EnumConstant # |
_EnumConstant :: Name Source #
newtype EnumConstantModifier Source #
Instances
data InterfaceDeclaration Source #
InterfaceDeclarationNormalInterface NormalInterfaceDeclaration | |
InterfaceDeclarationAnnotationType AnnotationTypeDeclaration |
Instances
data NormalInterfaceDeclaration Source #
Instances
data InterfaceModifier Source #
InterfaceModifierAnnotation Annotation | |
InterfaceModifierPublic | |
InterfaceModifierProtected | |
InterfaceModifierPrivate | |
InterfaceModifierAbstract | |
InterfaceModifierStatic | |
InterfaceModifierStrictfb |
Instances
Read InterfaceModifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show InterfaceModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> InterfaceModifier -> ShowS # show :: InterfaceModifier -> String # showList :: [InterfaceModifier] -> ShowS # | |
Eq InterfaceModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: InterfaceModifier -> InterfaceModifier -> Bool # (/=) :: InterfaceModifier -> InterfaceModifier -> Bool # | |
Ord InterfaceModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: InterfaceModifier -> InterfaceModifier -> Ordering # (<) :: InterfaceModifier -> InterfaceModifier -> Bool # (<=) :: InterfaceModifier -> InterfaceModifier -> Bool # (>) :: InterfaceModifier -> InterfaceModifier -> Bool # (>=) :: InterfaceModifier -> InterfaceModifier -> Bool # max :: InterfaceModifier -> InterfaceModifier -> InterfaceModifier # min :: InterfaceModifier -> InterfaceModifier -> InterfaceModifier # |
newtype InterfaceBody Source #
Instances
Read InterfaceBody Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS InterfaceBody # readList :: ReadS [InterfaceBody] # | |
Show InterfaceBody Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> InterfaceBody -> ShowS # show :: InterfaceBody -> String # showList :: [InterfaceBody] -> ShowS # | |
Eq InterfaceBody Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: InterfaceBody -> InterfaceBody -> Bool # (/=) :: InterfaceBody -> InterfaceBody -> Bool # | |
Ord InterfaceBody Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: InterfaceBody -> InterfaceBody -> Ordering # (<) :: InterfaceBody -> InterfaceBody -> Bool # (<=) :: InterfaceBody -> InterfaceBody -> Bool # (>) :: InterfaceBody -> InterfaceBody -> Bool # (>=) :: InterfaceBody -> InterfaceBody -> Bool # max :: InterfaceBody -> InterfaceBody -> InterfaceBody # min :: InterfaceBody -> InterfaceBody -> InterfaceBody # |
data InterfaceMemberDeclaration Source #
Instances
data ConstantDeclaration Source #
Instances
Read ConstantDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ConstantDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ConstantDeclaration -> ShowS # show :: ConstantDeclaration -> String # showList :: [ConstantDeclaration] -> ShowS # | |
Eq ConstantDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ConstantDeclaration -> ConstantDeclaration -> Bool # (/=) :: ConstantDeclaration -> ConstantDeclaration -> Bool # | |
Ord ConstantDeclaration Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ConstantDeclaration -> ConstantDeclaration -> Ordering # (<) :: ConstantDeclaration -> ConstantDeclaration -> Bool # (<=) :: ConstantDeclaration -> ConstantDeclaration -> Bool # (>) :: ConstantDeclaration -> ConstantDeclaration -> Bool # (>=) :: ConstantDeclaration -> ConstantDeclaration -> Bool # max :: ConstantDeclaration -> ConstantDeclaration -> ConstantDeclaration # min :: ConstantDeclaration -> ConstantDeclaration -> ConstantDeclaration # |
data ConstantModifier Source #
ConstantModifierAnnotation Annotation | |
ConstantModifierPublic | |
ConstantModifierStatic | |
ConstantModifierFinal |
Instances
Read ConstantModifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ConstantModifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ConstantModifier -> ShowS # show :: ConstantModifier -> String # showList :: [ConstantModifier] -> ShowS # | |
Eq ConstantModifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ConstantModifier -> ConstantModifier -> Bool # (/=) :: ConstantModifier -> ConstantModifier -> Bool # | |
Ord ConstantModifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ConstantModifier -> ConstantModifier -> Ordering # (<) :: ConstantModifier -> ConstantModifier -> Bool # (<=) :: ConstantModifier -> ConstantModifier -> Bool # (>) :: ConstantModifier -> ConstantModifier -> Bool # (>=) :: ConstantModifier -> ConstantModifier -> Bool # max :: ConstantModifier -> ConstantModifier -> ConstantModifier # min :: ConstantModifier -> ConstantModifier -> ConstantModifier # |
data InterfaceMethodDeclaration Source #
Instances
data InterfaceMethodModifier Source #
Instances
data AnnotationTypeDeclaration Source #
Instances
newtype AnnotationTypeBody Source #
Instances
Read AnnotationTypeBody Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show AnnotationTypeBody Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AnnotationTypeBody -> ShowS # show :: AnnotationTypeBody -> String # showList :: [AnnotationTypeBody] -> ShowS # | |
Eq AnnotationTypeBody Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AnnotationTypeBody -> AnnotationTypeBody -> Bool # (/=) :: AnnotationTypeBody -> AnnotationTypeBody -> Bool # | |
Ord AnnotationTypeBody Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AnnotationTypeBody -> AnnotationTypeBody -> Ordering # (<) :: AnnotationTypeBody -> AnnotationTypeBody -> Bool # (<=) :: AnnotationTypeBody -> AnnotationTypeBody -> Bool # (>) :: AnnotationTypeBody -> AnnotationTypeBody -> Bool # (>=) :: AnnotationTypeBody -> AnnotationTypeBody -> Bool # max :: AnnotationTypeBody -> AnnotationTypeBody -> AnnotationTypeBody # min :: AnnotationTypeBody -> AnnotationTypeBody -> AnnotationTypeBody # |
data AnnotationTypeMemberDeclaration Source #
Instances
data AnnotationTypeElementDeclaration Source #
Instances
data AnnotationTypeElementModifier Source #
Instances
newtype DefaultValue Source #
Instances
Read DefaultValue Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS DefaultValue # readList :: ReadS [DefaultValue] # | |
Show DefaultValue Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> DefaultValue -> ShowS # show :: DefaultValue -> String # showList :: [DefaultValue] -> ShowS # | |
Eq DefaultValue Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: DefaultValue -> DefaultValue -> Bool # (/=) :: DefaultValue -> DefaultValue -> Bool # | |
Ord DefaultValue Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: DefaultValue -> DefaultValue -> Ordering # (<) :: DefaultValue -> DefaultValue -> Bool # (<=) :: DefaultValue -> DefaultValue -> Bool # (>) :: DefaultValue -> DefaultValue -> Bool # (>=) :: DefaultValue -> DefaultValue -> Bool # max :: DefaultValue -> DefaultValue -> DefaultValue # min :: DefaultValue -> DefaultValue -> DefaultValue # |
_DefaultValue :: Name Source #
data Annotation Source #
AnnotationNormal NormalAnnotation | |
AnnotationMarker MarkerAnnotation | |
AnnotationSingleElement SingleElementAnnotation |
Instances
Read Annotation Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS Annotation # readList :: ReadS [Annotation] # readPrec :: ReadPrec Annotation # readListPrec :: ReadPrec [Annotation] # | |
Show Annotation Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> Annotation -> ShowS # show :: Annotation -> String # showList :: [Annotation] -> ShowS # | |
Eq Annotation Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: Annotation -> Annotation -> Bool # (/=) :: Annotation -> Annotation -> Bool # | |
Ord Annotation Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: Annotation -> Annotation -> Ordering # (<) :: Annotation -> Annotation -> Bool # (<=) :: Annotation -> Annotation -> Bool # (>) :: Annotation -> Annotation -> Bool # (>=) :: Annotation -> Annotation -> Bool # max :: Annotation -> Annotation -> Annotation # min :: Annotation -> Annotation -> Annotation # |
_Annotation :: Name Source #
data NormalAnnotation Source #
Instances
Read NormalAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show NormalAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> NormalAnnotation -> ShowS # show :: NormalAnnotation -> String # showList :: [NormalAnnotation] -> ShowS # | |
Eq NormalAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: NormalAnnotation -> NormalAnnotation -> Bool # (/=) :: NormalAnnotation -> NormalAnnotation -> Bool # | |
Ord NormalAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: NormalAnnotation -> NormalAnnotation -> Ordering # (<) :: NormalAnnotation -> NormalAnnotation -> Bool # (<=) :: NormalAnnotation -> NormalAnnotation -> Bool # (>) :: NormalAnnotation -> NormalAnnotation -> Bool # (>=) :: NormalAnnotation -> NormalAnnotation -> Bool # max :: NormalAnnotation -> NormalAnnotation -> NormalAnnotation # min :: NormalAnnotation -> NormalAnnotation -> NormalAnnotation # |
data ElementValuePair Source #
Instances
Read ElementValuePair Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ElementValuePair Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ElementValuePair -> ShowS # show :: ElementValuePair -> String # showList :: [ElementValuePair] -> ShowS # | |
Eq ElementValuePair Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ElementValuePair -> ElementValuePair -> Bool # (/=) :: ElementValuePair -> ElementValuePair -> Bool # | |
Ord ElementValuePair Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ElementValuePair -> ElementValuePair -> Ordering # (<) :: ElementValuePair -> ElementValuePair -> Bool # (<=) :: ElementValuePair -> ElementValuePair -> Bool # (>) :: ElementValuePair -> ElementValuePair -> Bool # (>=) :: ElementValuePair -> ElementValuePair -> Bool # max :: ElementValuePair -> ElementValuePair -> ElementValuePair # min :: ElementValuePair -> ElementValuePair -> ElementValuePair # |
data ElementValue Source #
ElementValueConditionalExpression ConditionalExpression | |
ElementValueElementValueArrayInitializer ElementValueArrayInitializer | |
ElementValueAnnotation Annotation |
Instances
Read ElementValue Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ElementValue # readList :: ReadS [ElementValue] # | |
Show ElementValue Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ElementValue -> ShowS # show :: ElementValue -> String # showList :: [ElementValue] -> ShowS # | |
Eq ElementValue Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ElementValue -> ElementValue -> Bool # (/=) :: ElementValue -> ElementValue -> Bool # | |
Ord ElementValue Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ElementValue -> ElementValue -> Ordering # (<) :: ElementValue -> ElementValue -> Bool # (<=) :: ElementValue -> ElementValue -> Bool # (>) :: ElementValue -> ElementValue -> Bool # (>=) :: ElementValue -> ElementValue -> Bool # max :: ElementValue -> ElementValue -> ElementValue # min :: ElementValue -> ElementValue -> ElementValue # |
_ElementValue :: Name Source #
newtype ElementValueArrayInitializer Source #
Instances
newtype MarkerAnnotation Source #
Instances
Read MarkerAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show MarkerAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MarkerAnnotation -> ShowS # show :: MarkerAnnotation -> String # showList :: [MarkerAnnotation] -> ShowS # | |
Eq MarkerAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MarkerAnnotation -> MarkerAnnotation -> Bool # (/=) :: MarkerAnnotation -> MarkerAnnotation -> Bool # | |
Ord MarkerAnnotation Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MarkerAnnotation -> MarkerAnnotation -> Ordering # (<) :: MarkerAnnotation -> MarkerAnnotation -> Bool # (<=) :: MarkerAnnotation -> MarkerAnnotation -> Bool # (>) :: MarkerAnnotation -> MarkerAnnotation -> Bool # (>=) :: MarkerAnnotation -> MarkerAnnotation -> Bool # max :: MarkerAnnotation -> MarkerAnnotation -> MarkerAnnotation # min :: MarkerAnnotation -> MarkerAnnotation -> MarkerAnnotation # |
data SingleElementAnnotation Source #
Instances
newtype ArrayInitializer Source #
Instances
Read ArrayInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ArrayInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ArrayInitializer -> ShowS # show :: ArrayInitializer -> String # showList :: [ArrayInitializer] -> ShowS # | |
Eq ArrayInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ArrayInitializer -> ArrayInitializer -> Bool # (/=) :: ArrayInitializer -> ArrayInitializer -> Bool # | |
Ord ArrayInitializer Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ArrayInitializer -> ArrayInitializer -> Ordering # (<) :: ArrayInitializer -> ArrayInitializer -> Bool # (<=) :: ArrayInitializer -> ArrayInitializer -> Bool # (>) :: ArrayInitializer -> ArrayInitializer -> Bool # (>=) :: ArrayInitializer -> ArrayInitializer -> Bool # max :: ArrayInitializer -> ArrayInitializer -> ArrayInitializer # min :: ArrayInitializer -> ArrayInitializer -> ArrayInitializer # |
Block | |
|
data BlockStatement Source #
BlockStatementLocalVariableDeclaration LocalVariableDeclarationStatement | |
BlockStatementClass ClassDeclaration | |
BlockStatementStatement Statement |
Instances
Read BlockStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS BlockStatement # readList :: ReadS [BlockStatement] # | |
Show BlockStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> BlockStatement -> ShowS # show :: BlockStatement -> String # showList :: [BlockStatement] -> ShowS # | |
Eq BlockStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: BlockStatement -> BlockStatement -> Bool # (/=) :: BlockStatement -> BlockStatement -> Bool # | |
Ord BlockStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: BlockStatement -> BlockStatement -> Ordering # (<) :: BlockStatement -> BlockStatement -> Bool # (<=) :: BlockStatement -> BlockStatement -> Bool # (>) :: BlockStatement -> BlockStatement -> Bool # (>=) :: BlockStatement -> BlockStatement -> Bool # max :: BlockStatement -> BlockStatement -> BlockStatement # min :: BlockStatement -> BlockStatement -> BlockStatement # |
newtype LocalVariableDeclarationStatement Source #
Instances
data LocalVariableDeclaration Source #
Instances
data LocalVariableType Source #
Instances
Read LocalVariableType Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show LocalVariableType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LocalVariableType -> ShowS # show :: LocalVariableType -> String # showList :: [LocalVariableType] -> ShowS # | |
Eq LocalVariableType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LocalVariableType -> LocalVariableType -> Bool # (/=) :: LocalVariableType -> LocalVariableType -> Bool # | |
Ord LocalVariableType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LocalVariableType -> LocalVariableType -> Ordering # (<) :: LocalVariableType -> LocalVariableType -> Bool # (<=) :: LocalVariableType -> LocalVariableType -> Bool # (>) :: LocalVariableType -> LocalVariableType -> Bool # (>=) :: LocalVariableType -> LocalVariableType -> Bool # max :: LocalVariableType -> LocalVariableType -> LocalVariableType # min :: LocalVariableType -> LocalVariableType -> LocalVariableType # |
_Statement :: Name Source #
data StatementNoShortIf Source #
Instances
Read StatementNoShortIf Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show StatementNoShortIf Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> StatementNoShortIf -> ShowS # show :: StatementNoShortIf -> String # showList :: [StatementNoShortIf] -> ShowS # | |
Eq StatementNoShortIf Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: StatementNoShortIf -> StatementNoShortIf -> Bool # (/=) :: StatementNoShortIf -> StatementNoShortIf -> Bool # | |
Ord StatementNoShortIf Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: StatementNoShortIf -> StatementNoShortIf -> Ordering # (<) :: StatementNoShortIf -> StatementNoShortIf -> Bool # (<=) :: StatementNoShortIf -> StatementNoShortIf -> Bool # (>) :: StatementNoShortIf -> StatementNoShortIf -> Bool # (>=) :: StatementNoShortIf -> StatementNoShortIf -> Bool # max :: StatementNoShortIf -> StatementNoShortIf -> StatementNoShortIf # min :: StatementNoShortIf -> StatementNoShortIf -> StatementNoShortIf # |
data StatementWithoutTrailingSubstatement Source #
Instances
data EmptyStatement Source #
Instances
Read EmptyStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS EmptyStatement # readList :: ReadS [EmptyStatement] # | |
Show EmptyStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EmptyStatement -> ShowS # show :: EmptyStatement -> String # showList :: [EmptyStatement] -> ShowS # | |
Eq EmptyStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EmptyStatement -> EmptyStatement -> Bool # (/=) :: EmptyStatement -> EmptyStatement -> Bool # | |
Ord EmptyStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EmptyStatement -> EmptyStatement -> Ordering # (<) :: EmptyStatement -> EmptyStatement -> Bool # (<=) :: EmptyStatement -> EmptyStatement -> Bool # (>) :: EmptyStatement -> EmptyStatement -> Bool # (>=) :: EmptyStatement -> EmptyStatement -> Bool # max :: EmptyStatement -> EmptyStatement -> EmptyStatement # min :: EmptyStatement -> EmptyStatement -> EmptyStatement # |
data LabeledStatement Source #
Instances
Read LabeledStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show LabeledStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LabeledStatement -> ShowS # show :: LabeledStatement -> String # showList :: [LabeledStatement] -> ShowS # | |
Eq LabeledStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LabeledStatement -> LabeledStatement -> Bool # (/=) :: LabeledStatement -> LabeledStatement -> Bool # | |
Ord LabeledStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LabeledStatement -> LabeledStatement -> Ordering # (<) :: LabeledStatement -> LabeledStatement -> Bool # (<=) :: LabeledStatement -> LabeledStatement -> Bool # (>) :: LabeledStatement -> LabeledStatement -> Bool # (>=) :: LabeledStatement -> LabeledStatement -> Bool # max :: LabeledStatement -> LabeledStatement -> LabeledStatement # min :: LabeledStatement -> LabeledStatement -> LabeledStatement # |
data LabeledStatementNoShortIf Source #
Instances
newtype ExpressionStatement Source #
Instances
Read ExpressionStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ExpressionStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ExpressionStatement -> ShowS # show :: ExpressionStatement -> String # showList :: [ExpressionStatement] -> ShowS # | |
Eq ExpressionStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ExpressionStatement -> ExpressionStatement -> Bool # (/=) :: ExpressionStatement -> ExpressionStatement -> Bool # | |
Ord ExpressionStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ExpressionStatement -> ExpressionStatement -> Ordering # (<) :: ExpressionStatement -> ExpressionStatement -> Bool # (<=) :: ExpressionStatement -> ExpressionStatement -> Bool # (>) :: ExpressionStatement -> ExpressionStatement -> Bool # (>=) :: ExpressionStatement -> ExpressionStatement -> Bool # max :: ExpressionStatement -> ExpressionStatement -> ExpressionStatement # min :: ExpressionStatement -> ExpressionStatement -> ExpressionStatement # |
data StatementExpression Source #
Instances
Read StatementExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show StatementExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> StatementExpression -> ShowS # show :: StatementExpression -> String # showList :: [StatementExpression] -> ShowS # | |
Eq StatementExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: StatementExpression -> StatementExpression -> Bool # (/=) :: StatementExpression -> StatementExpression -> Bool # | |
Ord StatementExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: StatementExpression -> StatementExpression -> Ordering # (<) :: StatementExpression -> StatementExpression -> Bool # (<=) :: StatementExpression -> StatementExpression -> Bool # (>) :: StatementExpression -> StatementExpression -> Bool # (>=) :: StatementExpression -> StatementExpression -> Bool # max :: StatementExpression -> StatementExpression -> StatementExpression # min :: StatementExpression -> StatementExpression -> StatementExpression # |
data IfThenStatement Source #
Instances
Read IfThenStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show IfThenStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> IfThenStatement -> ShowS # show :: IfThenStatement -> String # showList :: [IfThenStatement] -> ShowS # | |
Eq IfThenStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: IfThenStatement -> IfThenStatement -> Bool # (/=) :: IfThenStatement -> IfThenStatement -> Bool # | |
Ord IfThenStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: IfThenStatement -> IfThenStatement -> Ordering # (<) :: IfThenStatement -> IfThenStatement -> Bool # (<=) :: IfThenStatement -> IfThenStatement -> Bool # (>) :: IfThenStatement -> IfThenStatement -> Bool # (>=) :: IfThenStatement -> IfThenStatement -> Bool # max :: IfThenStatement -> IfThenStatement -> IfThenStatement # min :: IfThenStatement -> IfThenStatement -> IfThenStatement # |
data IfThenElseStatement Source #
Instances
Read IfThenElseStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show IfThenElseStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> IfThenElseStatement -> ShowS # show :: IfThenElseStatement -> String # showList :: [IfThenElseStatement] -> ShowS # | |
Eq IfThenElseStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: IfThenElseStatement -> IfThenElseStatement -> Bool # (/=) :: IfThenElseStatement -> IfThenElseStatement -> Bool # | |
Ord IfThenElseStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: IfThenElseStatement -> IfThenElseStatement -> Ordering # (<) :: IfThenElseStatement -> IfThenElseStatement -> Bool # (<=) :: IfThenElseStatement -> IfThenElseStatement -> Bool # (>) :: IfThenElseStatement -> IfThenElseStatement -> Bool # (>=) :: IfThenElseStatement -> IfThenElseStatement -> Bool # max :: IfThenElseStatement -> IfThenElseStatement -> IfThenElseStatement # min :: IfThenElseStatement -> IfThenElseStatement -> IfThenElseStatement # |
data IfThenElseStatementNoShortIf Source #
Instances
data AssertStatement Source #
Instances
Read AssertStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show AssertStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AssertStatement -> ShowS # show :: AssertStatement -> String # showList :: [AssertStatement] -> ShowS # | |
Eq AssertStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AssertStatement -> AssertStatement -> Bool # (/=) :: AssertStatement -> AssertStatement -> Bool # | |
Ord AssertStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AssertStatement -> AssertStatement -> Ordering # (<) :: AssertStatement -> AssertStatement -> Bool # (<=) :: AssertStatement -> AssertStatement -> Bool # (>) :: AssertStatement -> AssertStatement -> Bool # (>=) :: AssertStatement -> AssertStatement -> Bool # max :: AssertStatement -> AssertStatement -> AssertStatement # min :: AssertStatement -> AssertStatement -> AssertStatement # |
data AssertStatement_Pair Source #
Instances
data SwitchStatement Source #
Instances
Read SwitchStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show SwitchStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> SwitchStatement -> ShowS # show :: SwitchStatement -> String # showList :: [SwitchStatement] -> ShowS # | |
Eq SwitchStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: SwitchStatement -> SwitchStatement -> Bool # (/=) :: SwitchStatement -> SwitchStatement -> Bool # | |
Ord SwitchStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: SwitchStatement -> SwitchStatement -> Ordering # (<) :: SwitchStatement -> SwitchStatement -> Bool # (<=) :: SwitchStatement -> SwitchStatement -> Bool # (>) :: SwitchStatement -> SwitchStatement -> Bool # (>=) :: SwitchStatement -> SwitchStatement -> Bool # max :: SwitchStatement -> SwitchStatement -> SwitchStatement # min :: SwitchStatement -> SwitchStatement -> SwitchStatement # |
newtype SwitchBlock Source #
Instances
Read SwitchBlock Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS SwitchBlock # readList :: ReadS [SwitchBlock] # readPrec :: ReadPrec SwitchBlock # readListPrec :: ReadPrec [SwitchBlock] # | |
Show SwitchBlock Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> SwitchBlock -> ShowS # show :: SwitchBlock -> String # showList :: [SwitchBlock] -> ShowS # | |
Eq SwitchBlock Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: SwitchBlock -> SwitchBlock -> Bool # (/=) :: SwitchBlock -> SwitchBlock -> Bool # | |
Ord SwitchBlock Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: SwitchBlock -> SwitchBlock -> Ordering # (<) :: SwitchBlock -> SwitchBlock -> Bool # (<=) :: SwitchBlock -> SwitchBlock -> Bool # (>) :: SwitchBlock -> SwitchBlock -> Bool # (>=) :: SwitchBlock -> SwitchBlock -> Bool # max :: SwitchBlock -> SwitchBlock -> SwitchBlock # min :: SwitchBlock -> SwitchBlock -> SwitchBlock # |
_SwitchBlock :: Name Source #
data SwitchBlock_Pair Source #
Instances
Read SwitchBlock_Pair Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show SwitchBlock_Pair Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> SwitchBlock_Pair -> ShowS # show :: SwitchBlock_Pair -> String # showList :: [SwitchBlock_Pair] -> ShowS # | |
Eq SwitchBlock_Pair Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: SwitchBlock_Pair -> SwitchBlock_Pair -> Bool # (/=) :: SwitchBlock_Pair -> SwitchBlock_Pair -> Bool # | |
Ord SwitchBlock_Pair Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: SwitchBlock_Pair -> SwitchBlock_Pair -> Ordering # (<) :: SwitchBlock_Pair -> SwitchBlock_Pair -> Bool # (<=) :: SwitchBlock_Pair -> SwitchBlock_Pair -> Bool # (>) :: SwitchBlock_Pair -> SwitchBlock_Pair -> Bool # (>=) :: SwitchBlock_Pair -> SwitchBlock_Pair -> Bool # max :: SwitchBlock_Pair -> SwitchBlock_Pair -> SwitchBlock_Pair # min :: SwitchBlock_Pair -> SwitchBlock_Pair -> SwitchBlock_Pair # |
data SwitchBlockStatementGroup Source #
Instances
data SwitchLabel Source #
Instances
Read SwitchLabel Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS SwitchLabel # readList :: ReadS [SwitchLabel] # readPrec :: ReadPrec SwitchLabel # readListPrec :: ReadPrec [SwitchLabel] # | |
Show SwitchLabel Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> SwitchLabel -> ShowS # show :: SwitchLabel -> String # showList :: [SwitchLabel] -> ShowS # | |
Eq SwitchLabel Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: SwitchLabel -> SwitchLabel -> Bool # (/=) :: SwitchLabel -> SwitchLabel -> Bool # | |
Ord SwitchLabel Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: SwitchLabel -> SwitchLabel -> Ordering # (<) :: SwitchLabel -> SwitchLabel -> Bool # (<=) :: SwitchLabel -> SwitchLabel -> Bool # (>) :: SwitchLabel -> SwitchLabel -> Bool # (>=) :: SwitchLabel -> SwitchLabel -> Bool # max :: SwitchLabel -> SwitchLabel -> SwitchLabel # min :: SwitchLabel -> SwitchLabel -> SwitchLabel # |
_SwitchLabel :: Name Source #
newtype EnumConstantName Source #
Instances
Read EnumConstantName Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show EnumConstantName Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EnumConstantName -> ShowS # show :: EnumConstantName -> String # showList :: [EnumConstantName] -> ShowS # | |
Eq EnumConstantName Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EnumConstantName -> EnumConstantName -> Bool # (/=) :: EnumConstantName -> EnumConstantName -> Bool # | |
Ord EnumConstantName Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EnumConstantName -> EnumConstantName -> Ordering # (<) :: EnumConstantName -> EnumConstantName -> Bool # (<=) :: EnumConstantName -> EnumConstantName -> Bool # (>) :: EnumConstantName -> EnumConstantName -> Bool # (>=) :: EnumConstantName -> EnumConstantName -> Bool # max :: EnumConstantName -> EnumConstantName -> EnumConstantName # min :: EnumConstantName -> EnumConstantName -> EnumConstantName # |
data WhileStatement Source #
Instances
Read WhileStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS WhileStatement # readList :: ReadS [WhileStatement] # | |
Show WhileStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> WhileStatement -> ShowS # show :: WhileStatement -> String # showList :: [WhileStatement] -> ShowS # | |
Eq WhileStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: WhileStatement -> WhileStatement -> Bool # (/=) :: WhileStatement -> WhileStatement -> Bool # | |
Ord WhileStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: WhileStatement -> WhileStatement -> Ordering # (<) :: WhileStatement -> WhileStatement -> Bool # (<=) :: WhileStatement -> WhileStatement -> Bool # (>) :: WhileStatement -> WhileStatement -> Bool # (>=) :: WhileStatement -> WhileStatement -> Bool # max :: WhileStatement -> WhileStatement -> WhileStatement # min :: WhileStatement -> WhileStatement -> WhileStatement # |
data WhileStatementNoShortIf Source #
Instances
data DoStatement Source #
Instances
Read DoStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS DoStatement # readList :: ReadS [DoStatement] # readPrec :: ReadPrec DoStatement # readListPrec :: ReadPrec [DoStatement] # | |
Show DoStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> DoStatement -> ShowS # show :: DoStatement -> String # showList :: [DoStatement] -> ShowS # | |
Eq DoStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: DoStatement -> DoStatement -> Bool # (/=) :: DoStatement -> DoStatement -> Bool # | |
Ord DoStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: DoStatement -> DoStatement -> Ordering # (<) :: DoStatement -> DoStatement -> Bool # (<=) :: DoStatement -> DoStatement -> Bool # (>) :: DoStatement -> DoStatement -> Bool # (>=) :: DoStatement -> DoStatement -> Bool # max :: DoStatement -> DoStatement -> DoStatement # min :: DoStatement -> DoStatement -> DoStatement # |
_DoStatement :: Name Source #
data ForStatement Source #
Instances
Read ForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ForStatement # readList :: ReadS [ForStatement] # | |
Show ForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ForStatement -> ShowS # show :: ForStatement -> String # showList :: [ForStatement] -> ShowS # | |
Eq ForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ForStatement -> ForStatement -> Bool # (/=) :: ForStatement -> ForStatement -> Bool # | |
Ord ForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ForStatement -> ForStatement -> Ordering # (<) :: ForStatement -> ForStatement -> Bool # (<=) :: ForStatement -> ForStatement -> Bool # (>) :: ForStatement -> ForStatement -> Bool # (>=) :: ForStatement -> ForStatement -> Bool # max :: ForStatement -> ForStatement -> ForStatement # min :: ForStatement -> ForStatement -> ForStatement # |
_ForStatement :: Name Source #
data ForStatementNoShortIf Source #
ForStatementNoShortIfBasic BasicForStatementNoShortIf | |
ForStatementNoShortIfEnhanced EnhancedForStatementNoShortIf |
Instances
data BasicForStatement Source #
Instances
Read BasicForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show BasicForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> BasicForStatement -> ShowS # show :: BasicForStatement -> String # showList :: [BasicForStatement] -> ShowS # | |
Eq BasicForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: BasicForStatement -> BasicForStatement -> Bool # (/=) :: BasicForStatement -> BasicForStatement -> Bool # | |
Ord BasicForStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: BasicForStatement -> BasicForStatement -> Ordering # (<) :: BasicForStatement -> BasicForStatement -> Bool # (<=) :: BasicForStatement -> BasicForStatement -> Bool # (>) :: BasicForStatement -> BasicForStatement -> Bool # (>=) :: BasicForStatement -> BasicForStatement -> Bool # max :: BasicForStatement -> BasicForStatement -> BasicForStatement # min :: BasicForStatement -> BasicForStatement -> BasicForStatement # |
data BasicForStatementNoShortIf Source #
Instances
_ForUpdate :: Name Source #
data EnhancedForStatement Source #
Instances
data EnhancedForCond Source #
Instances
Read EnhancedForCond Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show EnhancedForCond Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EnhancedForCond -> ShowS # show :: EnhancedForCond -> String # showList :: [EnhancedForCond] -> ShowS # | |
Eq EnhancedForCond Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EnhancedForCond -> EnhancedForCond -> Bool # (/=) :: EnhancedForCond -> EnhancedForCond -> Bool # | |
Ord EnhancedForCond Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EnhancedForCond -> EnhancedForCond -> Ordering # (<) :: EnhancedForCond -> EnhancedForCond -> Bool # (<=) :: EnhancedForCond -> EnhancedForCond -> Bool # (>) :: EnhancedForCond -> EnhancedForCond -> Bool # (>=) :: EnhancedForCond -> EnhancedForCond -> Bool # max :: EnhancedForCond -> EnhancedForCond -> EnhancedForCond # min :: EnhancedForCond -> EnhancedForCond -> EnhancedForCond # |
data EnhancedForStatementNoShortIf Source #
Instances
newtype BreakStatement Source #
Instances
Read BreakStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS BreakStatement # readList :: ReadS [BreakStatement] # | |
Show BreakStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> BreakStatement -> ShowS # show :: BreakStatement -> String # showList :: [BreakStatement] -> ShowS # | |
Eq BreakStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: BreakStatement -> BreakStatement -> Bool # (/=) :: BreakStatement -> BreakStatement -> Bool # | |
Ord BreakStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: BreakStatement -> BreakStatement -> Ordering # (<) :: BreakStatement -> BreakStatement -> Bool # (<=) :: BreakStatement -> BreakStatement -> Bool # (>) :: BreakStatement -> BreakStatement -> Bool # (>=) :: BreakStatement -> BreakStatement -> Bool # max :: BreakStatement -> BreakStatement -> BreakStatement # min :: BreakStatement -> BreakStatement -> BreakStatement # |
newtype ContinueStatement Source #
Instances
Read ContinueStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ContinueStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ContinueStatement -> ShowS # show :: ContinueStatement -> String # showList :: [ContinueStatement] -> ShowS # | |
Eq ContinueStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ContinueStatement -> ContinueStatement -> Bool # (/=) :: ContinueStatement -> ContinueStatement -> Bool # | |
Ord ContinueStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ContinueStatement -> ContinueStatement -> Ordering # (<) :: ContinueStatement -> ContinueStatement -> Bool # (<=) :: ContinueStatement -> ContinueStatement -> Bool # (>) :: ContinueStatement -> ContinueStatement -> Bool # (>=) :: ContinueStatement -> ContinueStatement -> Bool # max :: ContinueStatement -> ContinueStatement -> ContinueStatement # min :: ContinueStatement -> ContinueStatement -> ContinueStatement # |
newtype ReturnStatement Source #
Instances
Read ReturnStatement Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ReturnStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ReturnStatement -> ShowS # show :: ReturnStatement -> String # showList :: [ReturnStatement] -> ShowS # | |
Eq ReturnStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ReturnStatement -> ReturnStatement -> Bool # (/=) :: ReturnStatement -> ReturnStatement -> Bool # | |
Ord ReturnStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ReturnStatement -> ReturnStatement -> Ordering # (<) :: ReturnStatement -> ReturnStatement -> Bool # (<=) :: ReturnStatement -> ReturnStatement -> Bool # (>) :: ReturnStatement -> ReturnStatement -> Bool # (>=) :: ReturnStatement -> ReturnStatement -> Bool # max :: ReturnStatement -> ReturnStatement -> ReturnStatement # min :: ReturnStatement -> ReturnStatement -> ReturnStatement # |
newtype ThrowStatement Source #
Instances
Read ThrowStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ThrowStatement # readList :: ReadS [ThrowStatement] # | |
Show ThrowStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ThrowStatement -> ShowS # show :: ThrowStatement -> String # showList :: [ThrowStatement] -> ShowS # | |
Eq ThrowStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ThrowStatement -> ThrowStatement -> Bool # (/=) :: ThrowStatement -> ThrowStatement -> Bool # | |
Ord ThrowStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ThrowStatement -> ThrowStatement -> Ordering # (<) :: ThrowStatement -> ThrowStatement -> Bool # (<=) :: ThrowStatement -> ThrowStatement -> Bool # (>) :: ThrowStatement -> ThrowStatement -> Bool # (>=) :: ThrowStatement -> ThrowStatement -> Bool # max :: ThrowStatement -> ThrowStatement -> ThrowStatement # min :: ThrowStatement -> ThrowStatement -> ThrowStatement # |
data SynchronizedStatement Source #
Instances
data TryStatement Source #
TryStatementSimple TryStatement_Simple | |
TryStatementWithFinally TryStatement_WithFinally | |
TryStatementWithResources TryWithResourcesStatement |
Instances
Read TryStatement Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS TryStatement # readList :: ReadS [TryStatement] # | |
Show TryStatement Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TryStatement -> ShowS # show :: TryStatement -> String # showList :: [TryStatement] -> ShowS # | |
Eq TryStatement Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TryStatement -> TryStatement -> Bool # (/=) :: TryStatement -> TryStatement -> Bool # | |
Ord TryStatement Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TryStatement -> TryStatement -> Ordering # (<) :: TryStatement -> TryStatement -> Bool # (<=) :: TryStatement -> TryStatement -> Bool # (>) :: TryStatement -> TryStatement -> Bool # (>=) :: TryStatement -> TryStatement -> Bool # max :: TryStatement -> TryStatement -> TryStatement # min :: TryStatement -> TryStatement -> TryStatement # |
_TryStatement :: Name Source #
data TryStatement_Simple Source #
Instances
Read TryStatement_Simple Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show TryStatement_Simple Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TryStatement_Simple -> ShowS # show :: TryStatement_Simple -> String # showList :: [TryStatement_Simple] -> ShowS # | |
Eq TryStatement_Simple Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TryStatement_Simple -> TryStatement_Simple -> Bool # (/=) :: TryStatement_Simple -> TryStatement_Simple -> Bool # | |
Ord TryStatement_Simple Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TryStatement_Simple -> TryStatement_Simple -> Ordering # (<) :: TryStatement_Simple -> TryStatement_Simple -> Bool # (<=) :: TryStatement_Simple -> TryStatement_Simple -> Bool # (>) :: TryStatement_Simple -> TryStatement_Simple -> Bool # (>=) :: TryStatement_Simple -> TryStatement_Simple -> Bool # max :: TryStatement_Simple -> TryStatement_Simple -> TryStatement_Simple # min :: TryStatement_Simple -> TryStatement_Simple -> TryStatement_Simple # |
data TryStatement_WithFinally Source #
Instances
Catches | |
|
data CatchClause Source #
Instances
Read CatchClause Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS CatchClause # readList :: ReadS [CatchClause] # readPrec :: ReadPrec CatchClause # readListPrec :: ReadPrec [CatchClause] # | |
Show CatchClause Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> CatchClause -> ShowS # show :: CatchClause -> String # showList :: [CatchClause] -> ShowS # | |
Eq CatchClause Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: CatchClause -> CatchClause -> Bool # (/=) :: CatchClause -> CatchClause -> Bool # | |
Ord CatchClause Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: CatchClause -> CatchClause -> Ordering # (<) :: CatchClause -> CatchClause -> Bool # (<=) :: CatchClause -> CatchClause -> Bool # (>) :: CatchClause -> CatchClause -> Bool # (>=) :: CatchClause -> CatchClause -> Bool # max :: CatchClause -> CatchClause -> CatchClause # min :: CatchClause -> CatchClause -> CatchClause # |
_CatchClause :: Name Source #
data CatchFormalParameter Source #
Instances
_CatchType :: Name Source #
data TryWithResourcesStatement Source #
Instances
newtype ResourceSpecification Source #
Instances
data Resource_Local Source #
Instances
Read Resource_Local Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS Resource_Local # readList :: ReadS [Resource_Local] # | |
Show Resource_Local Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> Resource_Local -> ShowS # show :: Resource_Local -> String # showList :: [Resource_Local] -> ShowS # | |
Eq Resource_Local Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: Resource_Local -> Resource_Local -> Bool # (/=) :: Resource_Local -> Resource_Local -> Bool # | |
Ord Resource_Local Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: Resource_Local -> Resource_Local -> Ordering # (<) :: Resource_Local -> Resource_Local -> Bool # (<=) :: Resource_Local -> Resource_Local -> Bool # (>) :: Resource_Local -> Resource_Local -> Bool # (>=) :: Resource_Local -> Resource_Local -> Bool # max :: Resource_Local -> Resource_Local -> Resource_Local # min :: Resource_Local -> Resource_Local -> Resource_Local # |
data VariableAccess Source #
Instances
Read VariableAccess Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS VariableAccess # readList :: ReadS [VariableAccess] # | |
Show VariableAccess Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> VariableAccess -> ShowS # show :: VariableAccess -> String # showList :: [VariableAccess] -> ShowS # | |
Eq VariableAccess Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: VariableAccess -> VariableAccess -> Bool # (/=) :: VariableAccess -> VariableAccess -> Bool # | |
Ord VariableAccess Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: VariableAccess -> VariableAccess -> Ordering # (<) :: VariableAccess -> VariableAccess -> Bool # (<=) :: VariableAccess -> VariableAccess -> Bool # (>) :: VariableAccess -> VariableAccess -> Bool # (>=) :: VariableAccess -> VariableAccess -> Bool # max :: VariableAccess -> VariableAccess -> VariableAccess # min :: VariableAccess -> VariableAccess -> VariableAccess # |
data PrimaryNoNewArray Source #
Instances
Read PrimaryNoNewArray Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show PrimaryNoNewArray Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PrimaryNoNewArray -> ShowS # show :: PrimaryNoNewArray -> String # showList :: [PrimaryNoNewArray] -> ShowS # | |
Eq PrimaryNoNewArray Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PrimaryNoNewArray -> PrimaryNoNewArray -> Bool # (/=) :: PrimaryNoNewArray -> PrimaryNoNewArray -> Bool # | |
Ord PrimaryNoNewArray Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PrimaryNoNewArray -> PrimaryNoNewArray -> Ordering # (<) :: PrimaryNoNewArray -> PrimaryNoNewArray -> Bool # (<=) :: PrimaryNoNewArray -> PrimaryNoNewArray -> Bool # (>) :: PrimaryNoNewArray -> PrimaryNoNewArray -> Bool # (>=) :: PrimaryNoNewArray -> PrimaryNoNewArray -> Bool # max :: PrimaryNoNewArray -> PrimaryNoNewArray -> PrimaryNoNewArray # min :: PrimaryNoNewArray -> PrimaryNoNewArray -> PrimaryNoNewArray # |
data ClassLiteral Source #
ClassLiteralType TypeNameArray | |
ClassLiteralNumericType NumericTypeArray | |
ClassLiteralBoolean BooleanArray | |
ClassLiteralVoid |
Instances
Read ClassLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ClassLiteral # readList :: ReadS [ClassLiteral] # | |
Show ClassLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ClassLiteral -> ShowS # show :: ClassLiteral -> String # showList :: [ClassLiteral] -> ShowS # | |
Eq ClassLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ClassLiteral -> ClassLiteral -> Bool # (/=) :: ClassLiteral -> ClassLiteral -> Bool # | |
Ord ClassLiteral Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ClassLiteral -> ClassLiteral -> Ordering # (<) :: ClassLiteral -> ClassLiteral -> Bool # (<=) :: ClassLiteral -> ClassLiteral -> Bool # (>) :: ClassLiteral -> ClassLiteral -> Bool # (>=) :: ClassLiteral -> ClassLiteral -> Bool # max :: ClassLiteral -> ClassLiteral -> ClassLiteral # min :: ClassLiteral -> ClassLiteral -> ClassLiteral # |
_ClassLiteral :: Name Source #
data TypeNameArray Source #
Instances
Read TypeNameArray Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS TypeNameArray # readList :: ReadS [TypeNameArray] # | |
Show TypeNameArray Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> TypeNameArray -> ShowS # show :: TypeNameArray -> String # showList :: [TypeNameArray] -> ShowS # | |
Eq TypeNameArray Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: TypeNameArray -> TypeNameArray -> Bool # (/=) :: TypeNameArray -> TypeNameArray -> Bool # | |
Ord TypeNameArray Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: TypeNameArray -> TypeNameArray -> Ordering # (<) :: TypeNameArray -> TypeNameArray -> Bool # (<=) :: TypeNameArray -> TypeNameArray -> Bool # (>) :: TypeNameArray -> TypeNameArray -> Bool # (>=) :: TypeNameArray -> TypeNameArray -> Bool # max :: TypeNameArray -> TypeNameArray -> TypeNameArray # min :: TypeNameArray -> TypeNameArray -> TypeNameArray # |
data NumericTypeArray Source #
Instances
Read NumericTypeArray Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show NumericTypeArray Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> NumericTypeArray -> ShowS # show :: NumericTypeArray -> String # showList :: [NumericTypeArray] -> ShowS # | |
Eq NumericTypeArray Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: NumericTypeArray -> NumericTypeArray -> Bool # (/=) :: NumericTypeArray -> NumericTypeArray -> Bool # | |
Ord NumericTypeArray Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: NumericTypeArray -> NumericTypeArray -> Ordering # (<) :: NumericTypeArray -> NumericTypeArray -> Bool # (<=) :: NumericTypeArray -> NumericTypeArray -> Bool # (>) :: NumericTypeArray -> NumericTypeArray -> Bool # (>=) :: NumericTypeArray -> NumericTypeArray -> Bool # max :: NumericTypeArray -> NumericTypeArray -> NumericTypeArray # min :: NumericTypeArray -> NumericTypeArray -> NumericTypeArray # |
data BooleanArray Source #
Instances
Read BooleanArray Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS BooleanArray # readList :: ReadS [BooleanArray] # | |
Show BooleanArray Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> BooleanArray -> ShowS # show :: BooleanArray -> String # showList :: [BooleanArray] -> ShowS # | |
Eq BooleanArray Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: BooleanArray -> BooleanArray -> Bool # (/=) :: BooleanArray -> BooleanArray -> Bool # | |
Ord BooleanArray Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: BooleanArray -> BooleanArray -> Ordering # (<) :: BooleanArray -> BooleanArray -> Bool # (<=) :: BooleanArray -> BooleanArray -> Bool # (>) :: BooleanArray -> BooleanArray -> Bool # (>=) :: BooleanArray -> BooleanArray -> Bool # max :: BooleanArray -> BooleanArray -> BooleanArray # min :: BooleanArray -> BooleanArray -> BooleanArray # |
_BooleanArray :: Name Source #
data ClassInstanceCreationExpression Source #
Instances
data ClassInstanceCreationExpression_Qualifier Source #
ClassInstanceCreationExpression_QualifierExpression ExpressionName | |
ClassInstanceCreationExpression_QualifierPrimary Primary |
Instances
data UnqualifiedClassInstanceCreationExpression Source #
Instances
data ClassOrInterfaceTypeToInstantiate Source #
Instances
data AnnotatedIdentifier Source #
Instances
Read AnnotatedIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show AnnotatedIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AnnotatedIdentifier -> ShowS # show :: AnnotatedIdentifier -> String # showList :: [AnnotatedIdentifier] -> ShowS # | |
Eq AnnotatedIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AnnotatedIdentifier -> AnnotatedIdentifier -> Bool # (/=) :: AnnotatedIdentifier -> AnnotatedIdentifier -> Bool # | |
Ord AnnotatedIdentifier Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AnnotatedIdentifier -> AnnotatedIdentifier -> Ordering # (<) :: AnnotatedIdentifier -> AnnotatedIdentifier -> Bool # (<=) :: AnnotatedIdentifier -> AnnotatedIdentifier -> Bool # (>) :: AnnotatedIdentifier -> AnnotatedIdentifier -> Bool # (>=) :: AnnotatedIdentifier -> AnnotatedIdentifier -> Bool # max :: AnnotatedIdentifier -> AnnotatedIdentifier -> AnnotatedIdentifier # min :: AnnotatedIdentifier -> AnnotatedIdentifier -> AnnotatedIdentifier # |
data TypeArgumentsOrDiamond Source #
Instances
data FieldAccess Source #
Instances
Read FieldAccess Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS FieldAccess # readList :: ReadS [FieldAccess] # readPrec :: ReadPrec FieldAccess # readListPrec :: ReadPrec [FieldAccess] # | |
Show FieldAccess Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> FieldAccess -> ShowS # show :: FieldAccess -> String # showList :: [FieldAccess] -> ShowS # | |
Eq FieldAccess Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: FieldAccess -> FieldAccess -> Bool # (/=) :: FieldAccess -> FieldAccess -> Bool # | |
Ord FieldAccess Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: FieldAccess -> FieldAccess -> Ordering # (<) :: FieldAccess -> FieldAccess -> Bool # (<=) :: FieldAccess -> FieldAccess -> Bool # (>) :: FieldAccess -> FieldAccess -> Bool # (>=) :: FieldAccess -> FieldAccess -> Bool # max :: FieldAccess -> FieldAccess -> FieldAccess # min :: FieldAccess -> FieldAccess -> FieldAccess # |
_FieldAccess :: Name Source #
data FieldAccess_Qualifier Source #
Instances
data ArrayAccess Source #
Instances
Read ArrayAccess Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS ArrayAccess # readList :: ReadS [ArrayAccess] # readPrec :: ReadPrec ArrayAccess # readListPrec :: ReadPrec [ArrayAccess] # | |
Show ArrayAccess Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ArrayAccess -> ShowS # show :: ArrayAccess -> String # showList :: [ArrayAccess] -> ShowS # | |
Eq ArrayAccess Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ArrayAccess -> ArrayAccess -> Bool # (/=) :: ArrayAccess -> ArrayAccess -> Bool # | |
Ord ArrayAccess Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ArrayAccess -> ArrayAccess -> Ordering # (<) :: ArrayAccess -> ArrayAccess -> Bool # (<=) :: ArrayAccess -> ArrayAccess -> Bool # (>) :: ArrayAccess -> ArrayAccess -> Bool # (>=) :: ArrayAccess -> ArrayAccess -> Bool # max :: ArrayAccess -> ArrayAccess -> ArrayAccess # min :: ArrayAccess -> ArrayAccess -> ArrayAccess # |
_ArrayAccess :: Name Source #
data ArrayAccess_Variant Source #
Instances
Read ArrayAccess_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ArrayAccess_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ArrayAccess_Variant -> ShowS # show :: ArrayAccess_Variant -> String # showList :: [ArrayAccess_Variant] -> ShowS # | |
Eq ArrayAccess_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ArrayAccess_Variant -> ArrayAccess_Variant -> Bool # (/=) :: ArrayAccess_Variant -> ArrayAccess_Variant -> Bool # | |
Ord ArrayAccess_Variant Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ArrayAccess_Variant -> ArrayAccess_Variant -> Ordering # (<) :: ArrayAccess_Variant -> ArrayAccess_Variant -> Bool # (<=) :: ArrayAccess_Variant -> ArrayAccess_Variant -> Bool # (>) :: ArrayAccess_Variant -> ArrayAccess_Variant -> Bool # (>=) :: ArrayAccess_Variant -> ArrayAccess_Variant -> Bool # max :: ArrayAccess_Variant -> ArrayAccess_Variant -> ArrayAccess_Variant # min :: ArrayAccess_Variant -> ArrayAccess_Variant -> ArrayAccess_Variant # |
data MethodInvocation Source #
Instances
Read MethodInvocation Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show MethodInvocation Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodInvocation -> ShowS # show :: MethodInvocation -> String # showList :: [MethodInvocation] -> ShowS # | |
Eq MethodInvocation Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodInvocation -> MethodInvocation -> Bool # (/=) :: MethodInvocation -> MethodInvocation -> Bool # | |
Ord MethodInvocation Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodInvocation -> MethodInvocation -> Ordering # (<) :: MethodInvocation -> MethodInvocation -> Bool # (<=) :: MethodInvocation -> MethodInvocation -> Bool # (>) :: MethodInvocation -> MethodInvocation -> Bool # (>=) :: MethodInvocation -> MethodInvocation -> Bool # max :: MethodInvocation -> MethodInvocation -> MethodInvocation # min :: MethodInvocation -> MethodInvocation -> MethodInvocation # |
data MethodInvocation_Header Source #
Instances
data MethodInvocation_Complex Source #
Instances
data MethodInvocation_Variant Source #
Instances
data MethodReference Source #
Instances
Read MethodReference Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show MethodReference Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodReference -> ShowS # show :: MethodReference -> String # showList :: [MethodReference] -> ShowS # | |
Eq MethodReference Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodReference -> MethodReference -> Bool # (/=) :: MethodReference -> MethodReference -> Bool # | |
Ord MethodReference Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodReference -> MethodReference -> Ordering # (<) :: MethodReference -> MethodReference -> Bool # (<=) :: MethodReference -> MethodReference -> Bool # (>) :: MethodReference -> MethodReference -> Bool # (>=) :: MethodReference -> MethodReference -> Bool # max :: MethodReference -> MethodReference -> MethodReference # min :: MethodReference -> MethodReference -> MethodReference # |
data MethodReference_Expression Source #
Instances
data MethodReference_Primary Source #
Instances
data MethodReference_ReferenceType Source #
Instances
data MethodReference_Super Source #
Instances
data MethodReference_New Source #
Instances
Read MethodReference_New Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show MethodReference_New Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> MethodReference_New -> ShowS # show :: MethodReference_New -> String # showList :: [MethodReference_New] -> ShowS # | |
Eq MethodReference_New Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: MethodReference_New -> MethodReference_New -> Bool # (/=) :: MethodReference_New -> MethodReference_New -> Bool # | |
Ord MethodReference_New Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: MethodReference_New -> MethodReference_New -> Ordering # (<) :: MethodReference_New -> MethodReference_New -> Bool # (<=) :: MethodReference_New -> MethodReference_New -> Bool # (>) :: MethodReference_New -> MethodReference_New -> Bool # (>=) :: MethodReference_New -> MethodReference_New -> Bool # max :: MethodReference_New -> MethodReference_New -> MethodReference_New # min :: MethodReference_New -> MethodReference_New -> MethodReference_New # |
newtype MethodReference_Array Source #
Instances
data ArrayCreationExpression Source #
Instances
data ArrayCreationExpression_Primitive Source #
Instances
data ArrayCreationExpression_ClassOrInterface Source #
Instances
data ArrayCreationExpression_PrimitiveArray Source #
Instances
data ArrayCreationExpression_ClassOrInterfaceArray Source #
Instances
data Expression Source #
Instances
Read Expression Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS Expression # readList :: ReadS [Expression] # readPrec :: ReadPrec Expression # readListPrec :: ReadPrec [Expression] # | |
Show Expression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> Expression -> ShowS # show :: Expression -> String # showList :: [Expression] -> ShowS # | |
Eq Expression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: Expression -> Expression -> Bool # (/=) :: Expression -> Expression -> Bool # | |
Ord Expression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: Expression -> Expression -> Ordering # (<) :: Expression -> Expression -> Bool # (<=) :: Expression -> Expression -> Bool # (>) :: Expression -> Expression -> Bool # (>=) :: Expression -> Expression -> Bool # max :: Expression -> Expression -> Expression # min :: Expression -> Expression -> Expression # |
_Expression :: Name Source #
data LambdaExpression Source #
Instances
Read LambdaExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show LambdaExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LambdaExpression -> ShowS # show :: LambdaExpression -> String # showList :: [LambdaExpression] -> ShowS # | |
Eq LambdaExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LambdaExpression -> LambdaExpression -> Bool # (/=) :: LambdaExpression -> LambdaExpression -> Bool # | |
Ord LambdaExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LambdaExpression -> LambdaExpression -> Ordering # (<) :: LambdaExpression -> LambdaExpression -> Bool # (<=) :: LambdaExpression -> LambdaExpression -> Bool # (>) :: LambdaExpression -> LambdaExpression -> Bool # (>=) :: LambdaExpression -> LambdaExpression -> Bool # max :: LambdaExpression -> LambdaExpression -> LambdaExpression # min :: LambdaExpression -> LambdaExpression -> LambdaExpression # |
data LambdaParameters Source #
Instances
Read LambdaParameters Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show LambdaParameters Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LambdaParameters -> ShowS # show :: LambdaParameters -> String # showList :: [LambdaParameters] -> ShowS # | |
Eq LambdaParameters Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LambdaParameters -> LambdaParameters -> Bool # (/=) :: LambdaParameters -> LambdaParameters -> Bool # | |
Ord LambdaParameters Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LambdaParameters -> LambdaParameters -> Ordering # (<) :: LambdaParameters -> LambdaParameters -> Bool # (<=) :: LambdaParameters -> LambdaParameters -> Bool # (>) :: LambdaParameters -> LambdaParameters -> Bool # (>=) :: LambdaParameters -> LambdaParameters -> Bool # max :: LambdaParameters -> LambdaParameters -> LambdaParameters # min :: LambdaParameters -> LambdaParameters -> LambdaParameters # |
data LambdaParameter Source #
Instances
Read LambdaParameter Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show LambdaParameter Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LambdaParameter -> ShowS # show :: LambdaParameter -> String # showList :: [LambdaParameter] -> ShowS # | |
Eq LambdaParameter Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LambdaParameter -> LambdaParameter -> Bool # (/=) :: LambdaParameter -> LambdaParameter -> Bool # | |
Ord LambdaParameter Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LambdaParameter -> LambdaParameter -> Ordering # (<) :: LambdaParameter -> LambdaParameter -> Bool # (<=) :: LambdaParameter -> LambdaParameter -> Bool # (>) :: LambdaParameter -> LambdaParameter -> Bool # (>=) :: LambdaParameter -> LambdaParameter -> Bool # max :: LambdaParameter -> LambdaParameter -> LambdaParameter # min :: LambdaParameter -> LambdaParameter -> LambdaParameter # |
data LambdaParameter_Normal Source #
Instances
data LambdaParameterType Source #
Instances
Read LambdaParameterType Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show LambdaParameterType Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LambdaParameterType -> ShowS # show :: LambdaParameterType -> String # showList :: [LambdaParameterType] -> ShowS # | |
Eq LambdaParameterType Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LambdaParameterType -> LambdaParameterType -> Bool # (/=) :: LambdaParameterType -> LambdaParameterType -> Bool # | |
Ord LambdaParameterType Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LambdaParameterType -> LambdaParameterType -> Ordering # (<) :: LambdaParameterType -> LambdaParameterType -> Bool # (<=) :: LambdaParameterType -> LambdaParameterType -> Bool # (>) :: LambdaParameterType -> LambdaParameterType -> Bool # (>=) :: LambdaParameterType -> LambdaParameterType -> Bool # max :: LambdaParameterType -> LambdaParameterType -> LambdaParameterType # min :: LambdaParameterType -> LambdaParameterType -> LambdaParameterType # |
data LambdaBody Source #
Instances
Read LambdaBody Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS LambdaBody # readList :: ReadS [LambdaBody] # readPrec :: ReadPrec LambdaBody # readListPrec :: ReadPrec [LambdaBody] # | |
Show LambdaBody Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LambdaBody -> ShowS # show :: LambdaBody -> String # showList :: [LambdaBody] -> ShowS # | |
Eq LambdaBody Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LambdaBody -> LambdaBody -> Bool # (/=) :: LambdaBody -> LambdaBody -> Bool # | |
Ord LambdaBody Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LambdaBody -> LambdaBody -> Ordering # (<) :: LambdaBody -> LambdaBody -> Bool # (<=) :: LambdaBody -> LambdaBody -> Bool # (>) :: LambdaBody -> LambdaBody -> Bool # (>=) :: LambdaBody -> LambdaBody -> Bool # max :: LambdaBody -> LambdaBody -> LambdaBody # min :: LambdaBody -> LambdaBody -> LambdaBody # |
_LambdaBody :: Name Source #
data AssignmentExpression Source #
Instances
data Assignment Source #
Instances
Read Assignment Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS Assignment # readList :: ReadS [Assignment] # readPrec :: ReadPrec Assignment # readListPrec :: ReadPrec [Assignment] # | |
Show Assignment Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> Assignment -> ShowS # show :: Assignment -> String # showList :: [Assignment] -> ShowS # | |
Eq Assignment Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: Assignment -> Assignment -> Bool # (/=) :: Assignment -> Assignment -> Bool # | |
Ord Assignment Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: Assignment -> Assignment -> Ordering # (<) :: Assignment -> Assignment -> Bool # (<=) :: Assignment -> Assignment -> Bool # (>) :: Assignment -> Assignment -> Bool # (>=) :: Assignment -> Assignment -> Bool # max :: Assignment -> Assignment -> Assignment # min :: Assignment -> Assignment -> Assignment # |
_Assignment :: Name Source #
data LeftHandSide Source #
LeftHandSideExpressionName ExpressionName | |
LeftHandSideFieldAccess FieldAccess | |
LeftHandSideArrayAccess ArrayAccess |
Instances
Read LeftHandSide Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS LeftHandSide # readList :: ReadS [LeftHandSide] # | |
Show LeftHandSide Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> LeftHandSide -> ShowS # show :: LeftHandSide -> String # showList :: [LeftHandSide] -> ShowS # | |
Eq LeftHandSide Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: LeftHandSide -> LeftHandSide -> Bool # (/=) :: LeftHandSide -> LeftHandSide -> Bool # | |
Ord LeftHandSide Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: LeftHandSide -> LeftHandSide -> Ordering # (<) :: LeftHandSide -> LeftHandSide -> Bool # (<=) :: LeftHandSide -> LeftHandSide -> Bool # (>) :: LeftHandSide -> LeftHandSide -> Bool # (>=) :: LeftHandSide -> LeftHandSide -> Bool # max :: LeftHandSide -> LeftHandSide -> LeftHandSide # min :: LeftHandSide -> LeftHandSide -> LeftHandSide # |
_LeftHandSide :: Name Source #
data AssignmentOperator Source #
Instances
Read AssignmentOperator Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show AssignmentOperator Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AssignmentOperator -> ShowS # show :: AssignmentOperator -> String # showList :: [AssignmentOperator] -> ShowS # | |
Eq AssignmentOperator Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AssignmentOperator -> AssignmentOperator -> Bool # (/=) :: AssignmentOperator -> AssignmentOperator -> Bool # | |
Ord AssignmentOperator Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AssignmentOperator -> AssignmentOperator -> Ordering # (<) :: AssignmentOperator -> AssignmentOperator -> Bool # (<=) :: AssignmentOperator -> AssignmentOperator -> Bool # (>) :: AssignmentOperator -> AssignmentOperator -> Bool # (>=) :: AssignmentOperator -> AssignmentOperator -> Bool # max :: AssignmentOperator -> AssignmentOperator -> AssignmentOperator # min :: AssignmentOperator -> AssignmentOperator -> AssignmentOperator # |
data ConditionalExpression Source #
ConditionalExpressionSimple ConditionalOrExpression | |
ConditionalExpressionTernaryCond ConditionalExpression_TernaryCond | |
ConditionalExpressionTernaryLambda ConditionalExpression_TernaryLambda |
Instances
data ConditionalExpression_TernaryCond Source #
Instances
data ConditionalExpression_TernaryLambda Source #
Instances
newtype ConditionalOrExpression Source #
Instances
newtype ConditionalAndExpression Source #
Instances
newtype InclusiveOrExpression Source #
Instances
newtype ExclusiveOrExpression Source #
Instances
newtype AndExpression Source #
Instances
Read AndExpression Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS AndExpression # readList :: ReadS [AndExpression] # | |
Show AndExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AndExpression -> ShowS # show :: AndExpression -> String # showList :: [AndExpression] -> ShowS # | |
Eq AndExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AndExpression -> AndExpression -> Bool # (/=) :: AndExpression -> AndExpression -> Bool # | |
Ord AndExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AndExpression -> AndExpression -> Ordering # (<) :: AndExpression -> AndExpression -> Bool # (<=) :: AndExpression -> AndExpression -> Bool # (>) :: AndExpression -> AndExpression -> Bool # (>=) :: AndExpression -> AndExpression -> Bool # max :: AndExpression -> AndExpression -> AndExpression # min :: AndExpression -> AndExpression -> AndExpression # |
data EqualityExpression Source #
EqualityExpressionUnary RelationalExpression | |
EqualityExpressionEqual EqualityExpression_Binary | |
EqualityExpressionNotEqual EqualityExpression_Binary |
Instances
Read EqualityExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show EqualityExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> EqualityExpression -> ShowS # show :: EqualityExpression -> String # showList :: [EqualityExpression] -> ShowS # | |
Eq EqualityExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: EqualityExpression -> EqualityExpression -> Bool # (/=) :: EqualityExpression -> EqualityExpression -> Bool # | |
Ord EqualityExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: EqualityExpression -> EqualityExpression -> Ordering # (<) :: EqualityExpression -> EqualityExpression -> Bool # (<=) :: EqualityExpression -> EqualityExpression -> Bool # (>) :: EqualityExpression -> EqualityExpression -> Bool # (>=) :: EqualityExpression -> EqualityExpression -> Bool # max :: EqualityExpression -> EqualityExpression -> EqualityExpression # min :: EqualityExpression -> EqualityExpression -> EqualityExpression # |
data EqualityExpression_Binary Source #
Instances
data RelationalExpression Source #
Instances
data RelationalExpression_LessThan Source #
Instances
data RelationalExpression_GreaterThan Source #
Instances
data RelationalExpression_LessThanEqual Source #
Instances
data RelationalExpression_GreaterThanEqual Source #
Instances
data RelationalExpression_InstanceOf Source #
Instances
data ShiftExpression Source #
ShiftExpressionUnary AdditiveExpression | |
ShiftExpressionShiftLeft ShiftExpression_Binary | |
ShiftExpressionShiftRight ShiftExpression_Binary | |
ShiftExpressionShiftRightZeroFill ShiftExpression_Binary |
Instances
Read ShiftExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ShiftExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ShiftExpression -> ShowS # show :: ShiftExpression -> String # showList :: [ShiftExpression] -> ShowS # | |
Eq ShiftExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ShiftExpression -> ShiftExpression -> Bool # (/=) :: ShiftExpression -> ShiftExpression -> Bool # | |
Ord ShiftExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ShiftExpression -> ShiftExpression -> Ordering # (<) :: ShiftExpression -> ShiftExpression -> Bool # (<=) :: ShiftExpression -> ShiftExpression -> Bool # (>) :: ShiftExpression -> ShiftExpression -> Bool # (>=) :: ShiftExpression -> ShiftExpression -> Bool # max :: ShiftExpression -> ShiftExpression -> ShiftExpression # min :: ShiftExpression -> ShiftExpression -> ShiftExpression # |
data ShiftExpression_Binary Source #
Instances
data AdditiveExpression Source #
AdditiveExpressionUnary MultiplicativeExpression | |
AdditiveExpressionPlus AdditiveExpression_Binary | |
AdditiveExpressionMinus AdditiveExpression_Binary |
Instances
Read AdditiveExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show AdditiveExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> AdditiveExpression -> ShowS # show :: AdditiveExpression -> String # showList :: [AdditiveExpression] -> ShowS # | |
Eq AdditiveExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: AdditiveExpression -> AdditiveExpression -> Bool # (/=) :: AdditiveExpression -> AdditiveExpression -> Bool # | |
Ord AdditiveExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: AdditiveExpression -> AdditiveExpression -> Ordering # (<) :: AdditiveExpression -> AdditiveExpression -> Bool # (<=) :: AdditiveExpression -> AdditiveExpression -> Bool # (>) :: AdditiveExpression -> AdditiveExpression -> Bool # (>=) :: AdditiveExpression -> AdditiveExpression -> Bool # max :: AdditiveExpression -> AdditiveExpression -> AdditiveExpression # min :: AdditiveExpression -> AdditiveExpression -> AdditiveExpression # |
data AdditiveExpression_Binary Source #
Instances
data MultiplicativeExpression Source #
Instances
data MultiplicativeExpression_Binary Source #
Instances
data UnaryExpression Source #
Instances
Read UnaryExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show UnaryExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> UnaryExpression -> ShowS # show :: UnaryExpression -> String # showList :: [UnaryExpression] -> ShowS # | |
Eq UnaryExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: UnaryExpression -> UnaryExpression -> Bool # (/=) :: UnaryExpression -> UnaryExpression -> Bool # | |
Ord UnaryExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: UnaryExpression -> UnaryExpression -> Ordering # (<) :: UnaryExpression -> UnaryExpression -> Bool # (<=) :: UnaryExpression -> UnaryExpression -> Bool # (>) :: UnaryExpression -> UnaryExpression -> Bool # (>=) :: UnaryExpression -> UnaryExpression -> Bool # max :: UnaryExpression -> UnaryExpression -> UnaryExpression # min :: UnaryExpression -> UnaryExpression -> UnaryExpression # |
newtype PreIncrementExpression Source #
Instances
newtype PreDecrementExpression Source #
Instances
data UnaryExpressionNotPlusMinus Source #
UnaryExpressionNotPlusMinusPostfix PostfixExpression | |
UnaryExpressionNotPlusMinusTilde UnaryExpression | |
UnaryExpressionNotPlusMinusNot UnaryExpression | |
UnaryExpressionNotPlusMinusCast CastExpression |
Instances
data PostfixExpression Source #
PostfixExpressionPrimary Primary | |
PostfixExpressionName ExpressionName | |
PostfixExpressionPostIncrement PostIncrementExpression | |
PostfixExpressionPostDecrement PostDecrementExpression |
Instances
Read PostfixExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show PostfixExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> PostfixExpression -> ShowS # show :: PostfixExpression -> String # showList :: [PostfixExpression] -> ShowS # | |
Eq PostfixExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: PostfixExpression -> PostfixExpression -> Bool # (/=) :: PostfixExpression -> PostfixExpression -> Bool # | |
Ord PostfixExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: PostfixExpression -> PostfixExpression -> Ordering # (<) :: PostfixExpression -> PostfixExpression -> Bool # (<=) :: PostfixExpression -> PostfixExpression -> Bool # (>) :: PostfixExpression -> PostfixExpression -> Bool # (>=) :: PostfixExpression -> PostfixExpression -> Bool # max :: PostfixExpression -> PostfixExpression -> PostfixExpression # min :: PostfixExpression -> PostfixExpression -> PostfixExpression # |
newtype PostIncrementExpression Source #
Instances
newtype PostDecrementExpression Source #
Instances
data CastExpression Source #
CastExpressionPrimitive CastExpression_Primitive | |
CastExpressionNotPlusMinus CastExpression_NotPlusMinus | |
CastExpressionLambda CastExpression_Lambda |
Instances
Read CastExpression Source # | |
Defined in Hydra.Ext.Java.Syntax readsPrec :: Int -> ReadS CastExpression # readList :: ReadS [CastExpression] # | |
Show CastExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> CastExpression -> ShowS # show :: CastExpression -> String # showList :: [CastExpression] -> ShowS # | |
Eq CastExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: CastExpression -> CastExpression -> Bool # (/=) :: CastExpression -> CastExpression -> Bool # | |
Ord CastExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: CastExpression -> CastExpression -> Ordering # (<) :: CastExpression -> CastExpression -> Bool # (<=) :: CastExpression -> CastExpression -> Bool # (>) :: CastExpression -> CastExpression -> Bool # (>=) :: CastExpression -> CastExpression -> Bool # max :: CastExpression -> CastExpression -> CastExpression # min :: CastExpression -> CastExpression -> CastExpression # |
data CastExpression_Primitive Source #
Instances
data CastExpression_NotPlusMinus Source #
Instances
data CastExpression_Lambda Source #
Instances
data CastExpression_RefAndBounds Source #
Instances
newtype ConstantExpression Source #
Instances
Read ConstantExpression Source # | |
Defined in Hydra.Ext.Java.Syntax | |
Show ConstantExpression Source # | |
Defined in Hydra.Ext.Java.Syntax showsPrec :: Int -> ConstantExpression -> ShowS # show :: ConstantExpression -> String # showList :: [ConstantExpression] -> ShowS # | |
Eq ConstantExpression Source # | |
Defined in Hydra.Ext.Java.Syntax (==) :: ConstantExpression -> ConstantExpression -> Bool # (/=) :: ConstantExpression -> ConstantExpression -> Bool # | |
Ord ConstantExpression Source # | |
Defined in Hydra.Ext.Java.Syntax compare :: ConstantExpression -> ConstantExpression -> Ordering # (<) :: ConstantExpression -> ConstantExpression -> Bool # (<=) :: ConstantExpression -> ConstantExpression -> Bool # (>) :: ConstantExpression -> ConstantExpression -> Bool # (>=) :: ConstantExpression -> ConstantExpression -> Bool # max :: ConstantExpression -> ConstantExpression -> ConstantExpression # min :: ConstantExpression -> ConstantExpression -> ConstantExpression # |