language-java-0.2.8: Java source manipulation

Safe HaskellSafe
LanguageHaskell98

Language.Java.Syntax

Synopsis

Documentation

data CompilationUnitNode l Source #

A compilation unit is the top level syntactic goal symbol of a Java program.

Instances

HasNode ModuleDeclaration CompilationUnitNode Source # 
HasNode CompilationUnit CompilationUnitNode Source # 
Eq l => Eq (CompilationUnitNode l) Source # 
Data l => Data (CompilationUnitNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CompilationUnitNode l -> c (CompilationUnitNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CompilationUnitNode l) #

toConstr :: CompilationUnitNode l -> Constr #

dataTypeOf :: CompilationUnitNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (CompilationUnitNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CompilationUnitNode l)) #

gmapT :: (forall b. Data b => b -> b) -> CompilationUnitNode l -> CompilationUnitNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CompilationUnitNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CompilationUnitNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> CompilationUnitNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CompilationUnitNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CompilationUnitNode l -> m (CompilationUnitNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CompilationUnitNode l -> m (CompilationUnitNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CompilationUnitNode l -> m (CompilationUnitNode l) #

Read l => Read (CompilationUnitNode l) Source # 
Show l => Show (CompilationUnitNode l) Source # 
Generic (CompilationUnitNode l) Source # 

Associated Types

type Rep (CompilationUnitNode l) :: * -> * #

Show l => Pretty (CompilationUnitNode l) Source # 
type Rep (CompilationUnitNode l) Source # 
type Rep (CompilationUnitNode l) = D1 (MetaData "CompilationUnitNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "CompilationUnitNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CompilationUnit l)))) (C1 (MetaCons "ModuleDeclarationNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ModuleDeclaration l)))))

data ModuleSpecNode l Source #

specifies the module declarations

Constructors

ModuleRequiresNode (ModuleRequires l)

requires the module to work

ModuleExportsNode (ModuleExports l)

exports the package

Instances

HasNode ModuleExports ModuleSpecNode Source # 
HasNode ModuleRequires ModuleSpecNode Source # 
Eq l => Eq (ModuleSpecNode l) Source # 
Data l => Data (ModuleSpecNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleSpecNode l -> c (ModuleSpecNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleSpecNode l) #

toConstr :: ModuleSpecNode l -> Constr #

dataTypeOf :: ModuleSpecNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleSpecNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleSpecNode l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleSpecNode l -> ModuleSpecNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleSpecNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleSpecNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleSpecNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleSpecNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleSpecNode l -> m (ModuleSpecNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleSpecNode l -> m (ModuleSpecNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleSpecNode l -> m (ModuleSpecNode l) #

Read l => Read (ModuleSpecNode l) Source # 
Show l => Show (ModuleSpecNode l) Source # 
Generic (ModuleSpecNode l) Source # 

Associated Types

type Rep (ModuleSpecNode l) :: * -> * #

Show l => Pretty (ModuleSpecNode l) Source # 
type Rep (ModuleSpecNode l) Source # 
type Rep (ModuleSpecNode l) = D1 (MetaData "ModuleSpecNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "ModuleRequiresNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ModuleRequires l)))) (C1 (MetaCons "ModuleExportsNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ModuleExports l)))))

data TypeDeclNode l Source #

A type declaration declares a class type or an interface type.

Instances

HasNode InterfaceDecl TypeDeclNode Source # 
HasNode ClassDeclNode TypeDeclNode Source # 
Eq l => Eq (TypeDeclNode l) Source # 
Data l => Data (TypeDeclNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeDeclNode l -> c (TypeDeclNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TypeDeclNode l) #

toConstr :: TypeDeclNode l -> Constr #

dataTypeOf :: TypeDeclNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (TypeDeclNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TypeDeclNode l)) #

gmapT :: (forall b. Data b => b -> b) -> TypeDeclNode l -> TypeDeclNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeDeclNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeDeclNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeDeclNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeDeclNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeDeclNode l -> m (TypeDeclNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeDeclNode l -> m (TypeDeclNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeDeclNode l -> m (TypeDeclNode l) #

Read l => Read (TypeDeclNode l) Source # 
Show l => Show (TypeDeclNode l) Source # 
Generic (TypeDeclNode l) Source # 

Associated Types

type Rep (TypeDeclNode l) :: * -> * #

Methods

from :: TypeDeclNode l -> Rep (TypeDeclNode l) x #

to :: Rep (TypeDeclNode l) x -> TypeDeclNode l #

CollectTypes (TypeDeclNode l) Source # 
HasType (TypeDeclNode l) Source #

Get type of TypeDeclNode

Show l => Pretty (TypeDeclNode l) Source # 
HasBody (TypeDeclNode l) l Source #

Get the body of TypeDecl

Methods

getBody :: TypeDeclNode l -> [DeclNode l] Source #

type Rep (TypeDeclNode l) Source # 
type Rep (TypeDeclNode l) = D1 (MetaData "TypeDeclNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "ClassTypeDeclNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ClassDeclNode l)))) (C1 (MetaCons "InterfaceTypeDeclNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (InterfaceDecl l)))))

data ClassDeclNode l Source #

A class declaration specifies a new named reference type.

Instances

HasNode EnumDecl ClassDeclNode Source # 
HasNode ClassDecl ClassDeclNode Source # 
HasNode ClassDeclNode BlockStmtNode Source # 
HasNode ClassDeclNode MemberDeclNode Source # 
HasNode ClassDeclNode TypeDeclNode Source # 
Eq l => Eq (ClassDeclNode l) Source # 
Data l => Data (ClassDeclNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassDeclNode l -> c (ClassDeclNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassDeclNode l) #

toConstr :: ClassDeclNode l -> Constr #

dataTypeOf :: ClassDeclNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ClassDeclNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassDeclNode l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassDeclNode l -> ClassDeclNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassDeclNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassDeclNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassDeclNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassDeclNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassDeclNode l -> m (ClassDeclNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassDeclNode l -> m (ClassDeclNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassDeclNode l -> m (ClassDeclNode l) #

Read l => Read (ClassDeclNode l) Source # 
Show l => Show (ClassDeclNode l) Source # 
Generic (ClassDeclNode l) Source # 

Associated Types

type Rep (ClassDeclNode l) :: * -> * #

CollectTypes (ClassDeclNode l) Source # 
HasType (ClassDeclNode l) Source #

Get type of ClassDecl

Show l => Pretty (ClassDeclNode l) Source # 
HasBody (ClassDeclNode l) l Source #

Get the body of ClassDecl

type Rep (ClassDeclNode l) Source # 
type Rep (ClassDeclNode l) = D1 (MetaData "ClassDeclNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "ClassDeclNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ClassDecl l)))) (C1 (MetaCons "EnumDeclNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (EnumDecl l)))))

data DeclNode l Source #

A declaration is either a member declaration, or a declaration of an initializer, which may be static.

Instances

HasNode InitDecl DeclNode Source # 

Methods

toNode :: InitDecl l -> DeclNode l Source #

HasNode MemberDeclNode DeclNode Source # 
Eq l => Eq (DeclNode l) Source # 

Methods

(==) :: DeclNode l -> DeclNode l -> Bool #

(/=) :: DeclNode l -> DeclNode l -> Bool #

Data l => Data (DeclNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeclNode l -> c (DeclNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DeclNode l) #

toConstr :: DeclNode l -> Constr #

dataTypeOf :: DeclNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (DeclNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DeclNode l)) #

gmapT :: (forall b. Data b => b -> b) -> DeclNode l -> DeclNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeclNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeclNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeclNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeclNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeclNode l -> m (DeclNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeclNode l -> m (DeclNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeclNode l -> m (DeclNode l) #

Read l => Read (DeclNode l) Source # 
Show l => Show (DeclNode l) Source # 

Methods

showsPrec :: Int -> DeclNode l -> ShowS #

show :: DeclNode l -> String #

showList :: [DeclNode l] -> ShowS #

Generic (DeclNode l) Source # 

Associated Types

type Rep (DeclNode l) :: * -> * #

Methods

from :: DeclNode l -> Rep (DeclNode l) x #

to :: Rep (DeclNode l) x -> DeclNode l #

Show l => Pretty (DeclNode l) Source # 
type Rep (DeclNode l) Source # 
type Rep (DeclNode l) = D1 (MetaData "DeclNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "MemberDeclNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (MemberDeclNode l)))) (C1 (MetaCons "InitDeclNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (InitDecl l)))))

data MemberDeclNode l Source #

A class or interface member can be an inner class or interface, a field or constant, or a method or constructor. An interface may only have as members constants (not fields), abstract methods, and no constructors.

Constructors

FieldDeclNode (FieldDecl l)

The variables of a class type are introduced by field declarations.

MethodDeclNode (MethodDecl l)

A method declares executable code that can be invoked, passing a fixed number of values as arguments.

ConstructorDeclNode (ConstructorDecl l)

A constructor is used in the creation of an object that is an instance of a class.

MemberClassDeclNode (ClassDeclNode l)

A member class is a class whose declaration is directly enclosed in another class or interface declaration.

MemberInterfaceDeclNode (InterfaceDecl l)

A member interface is an interface whose declaration is directly enclosed in another class or interface declaration.

Instances

HasNode ConstructorDecl MemberDeclNode Source # 
HasNode MethodDecl MemberDeclNode Source # 
HasNode FieldDecl MemberDeclNode Source # 
HasNode InterfaceDecl MemberDeclNode Source # 
HasNode MemberDeclNode DeclNode Source # 
HasNode ClassDeclNode MemberDeclNode Source # 
Eq l => Eq (MemberDeclNode l) Source # 
Data l => Data (MemberDeclNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MemberDeclNode l -> c (MemberDeclNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MemberDeclNode l) #

toConstr :: MemberDeclNode l -> Constr #

dataTypeOf :: MemberDeclNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (MemberDeclNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MemberDeclNode l)) #

gmapT :: (forall b. Data b => b -> b) -> MemberDeclNode l -> MemberDeclNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MemberDeclNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MemberDeclNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MemberDeclNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MemberDeclNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MemberDeclNode l -> m (MemberDeclNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MemberDeclNode l -> m (MemberDeclNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MemberDeclNode l -> m (MemberDeclNode l) #

Read l => Read (MemberDeclNode l) Source # 
Show l => Show (MemberDeclNode l) Source # 
Generic (MemberDeclNode l) Source # 

Associated Types

type Rep (MemberDeclNode l) :: * -> * #

CollectTypes (MemberDeclNode l) Source #

Get type of MemberDecl if it is a MethodDecl (our solution to handeling the Maybe)

Show l => Pretty (MemberDeclNode l) Source # 
type Rep (MemberDeclNode l) Source # 

data VarDeclIdNode l Source #

The name of a variable in a declaration, which may be an array.

Constructors

VarIdNode (VarId l) 
VarDeclArrayNode (VarDeclIdNode l)

Multi-dimensional arrays are represented by nested applications of VarDeclArray.

Instances

HasNode VarId VarDeclIdNode Source # 

Methods

toNode :: VarId l -> VarDeclIdNode l Source #

HasNode VarDeclIdNode VarDeclIdNode Source # 
Eq l => Eq (VarDeclIdNode l) Source # 
Data l => Data (VarDeclIdNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VarDeclIdNode l -> c (VarDeclIdNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VarDeclIdNode l) #

toConstr :: VarDeclIdNode l -> Constr #

dataTypeOf :: VarDeclIdNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VarDeclIdNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VarDeclIdNode l)) #

gmapT :: (forall b. Data b => b -> b) -> VarDeclIdNode l -> VarDeclIdNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VarDeclIdNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VarDeclIdNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> VarDeclIdNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VarDeclIdNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VarDeclIdNode l -> m (VarDeclIdNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VarDeclIdNode l -> m (VarDeclIdNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VarDeclIdNode l -> m (VarDeclIdNode l) #

Read l => Read (VarDeclIdNode l) Source # 
Show l => Show (VarDeclIdNode l) Source # 
Generic (VarDeclIdNode l) Source # 

Associated Types

type Rep (VarDeclIdNode l) :: * -> * #

Show l => Pretty (VarDeclIdNode l) Source # 
type Rep (VarDeclIdNode l) Source # 
type Rep (VarDeclIdNode l) = D1 (MetaData "VarDeclIdNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "VarIdNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (VarId l)))) (C1 (MetaCons "VarDeclArrayNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (VarDeclIdNode l)))))

data VarInitNode l Source #

Explicit initializer for a variable declaration.

Instances

HasNode ArrayInit VarInitNode Source # 
HasNode ExpNode VarInitNode Source # 

Methods

toNode :: ExpNode l -> VarInitNode l Source #

Eq l => Eq (VarInitNode l) Source # 
Data l => Data (VarInitNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VarInitNode l -> c (VarInitNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VarInitNode l) #

toConstr :: VarInitNode l -> Constr #

dataTypeOf :: VarInitNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VarInitNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VarInitNode l)) #

gmapT :: (forall b. Data b => b -> b) -> VarInitNode l -> VarInitNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VarInitNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VarInitNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> VarInitNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VarInitNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VarInitNode l -> m (VarInitNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VarInitNode l -> m (VarInitNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VarInitNode l -> m (VarInitNode l) #

Read l => Read (VarInitNode l) Source # 
Show l => Show (VarInitNode l) Source # 
Generic (VarInitNode l) Source # 

Associated Types

type Rep (VarInitNode l) :: * -> * #

Methods

from :: VarInitNode l -> Rep (VarInitNode l) x #

to :: Rep (VarInitNode l) x -> VarInitNode l #

Show l => Pretty (VarInitNode l) Source # 
type Rep (VarInitNode l) Source # 
type Rep (VarInitNode l) = D1 (MetaData "VarInitNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "InitExpNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "InitArrayNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayInit l)))))

data ExplConstrInvNode l Source #

An explicit constructor invocation invokes another constructor of the same class, or a constructor of the direct superclass, which may be qualified to explicitly specify the newly created object's immediately enclosing instance.

Instances

HasNode PrimarySuperInvoke ExplConstrInvNode Source # 
HasNode SuperInvoke ExplConstrInvNode Source # 
HasNode ThisInvoke ExplConstrInvNode Source # 
Eq l => Eq (ExplConstrInvNode l) Source # 
Data l => Data (ExplConstrInvNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExplConstrInvNode l -> c (ExplConstrInvNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ExplConstrInvNode l) #

toConstr :: ExplConstrInvNode l -> Constr #

dataTypeOf :: ExplConstrInvNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ExplConstrInvNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ExplConstrInvNode l)) #

gmapT :: (forall b. Data b => b -> b) -> ExplConstrInvNode l -> ExplConstrInvNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExplConstrInvNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExplConstrInvNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExplConstrInvNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExplConstrInvNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExplConstrInvNode l -> m (ExplConstrInvNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExplConstrInvNode l -> m (ExplConstrInvNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExplConstrInvNode l -> m (ExplConstrInvNode l) #

Read l => Read (ExplConstrInvNode l) Source # 
Show l => Show (ExplConstrInvNode l) Source # 
Generic (ExplConstrInvNode l) Source # 

Associated Types

type Rep (ExplConstrInvNode l) :: * -> * #

Show l => Pretty (ExplConstrInvNode l) Source # 
type Rep (ExplConstrInvNode l) Source # 
type Rep (ExplConstrInvNode l) = D1 (MetaData "ExplConstrInvNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "ThisInvokeNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ThisInvoke l)))) ((:+:) (C1 (MetaCons "SuperInvokeNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SuperInvoke l)))) (C1 (MetaCons "PrimarySuperInvokeNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (PrimarySuperInvoke l))))))

data BlockStmtNode l Source #

A block statement is either a normal statement, a local class declaration or a local variable declaration.

Instances

HasNode LocalVars BlockStmtNode Source # 
HasNode StmtNode BlockStmtNode Source # 
HasNode ClassDeclNode BlockStmtNode Source # 
Eq l => Eq (BlockStmtNode l) Source # 
Data l => Data (BlockStmtNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BlockStmtNode l -> c (BlockStmtNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BlockStmtNode l) #

toConstr :: BlockStmtNode l -> Constr #

dataTypeOf :: BlockStmtNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (BlockStmtNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BlockStmtNode l)) #

gmapT :: (forall b. Data b => b -> b) -> BlockStmtNode l -> BlockStmtNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BlockStmtNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BlockStmtNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> BlockStmtNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BlockStmtNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BlockStmtNode l -> m (BlockStmtNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BlockStmtNode l -> m (BlockStmtNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BlockStmtNode l -> m (BlockStmtNode l) #

Read l => Read (BlockStmtNode l) Source # 
Show l => Show (BlockStmtNode l) Source # 
Generic (BlockStmtNode l) Source # 

Associated Types

type Rep (BlockStmtNode l) :: * -> * #

Show l => Pretty (BlockStmtNode l) Source # 
type Rep (BlockStmtNode l) Source # 
type Rep (BlockStmtNode l) = D1 (MetaData "BlockStmtNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "BlockStmtNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StmtNode l)))) ((:+:) (C1 (MetaCons "LocalClassNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ClassDeclNode l)))) (C1 (MetaCons "LocalVarsNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LocalVars l))))))

data StmtNode l Source #

A Java statement.

Constructors

StmtBlockNode (Block l)

A statement can be a nested block.

IfThenElseNode (IfThenElse l)

The if-then statement allows conditional execution of a statement.

WhileNode (While l)

The while statement executes an expression and a statement repeatedly until the value of the expression is false.

BasicForNode (BasicFor l)

The basic for statement executes some initialization code, then executes an expression, a statement, and some update code repeatedly until the value of the expression is false.

EnhancedForNode (EnhancedFor l)

The enhanced for statement iterates over an array or a value of a class that implements the iterator interface.

EmptyNode (Empty l)

An empty statement does nothing.

ExpStmtNode (ExpNode l)

Certain kinds of expressions may be used as statements by following them with semicolons: assignments, pre- or post-inc- or decrementation, method invocation or class instance creation expressions.

AssertNode (Assert l)

An assertion is a statement containing a boolean expression, where an error is reported if the expression evaluates to false.

SwitchNode (Switch l)

The switch statement transfers control to one of several statements depending on the value of an expression.

DoNode (Do l)

The do statement executes a statement and an expression repeatedly until the value of the expression is false.

BreakNode (Break l)

A break statement transfers control out of an enclosing statement.

ContinueNode (Continue l)

A continue statement may occur only in a while, do, or for statement. Control passes to the loop-continuation point of that statement.

ReturnNode (Return l) 
SynchronizedNode (Synchronized l)

A synchronized statement acquires a mutual-exclusion lock on behalf of the executing thread, executes a block, then releases the lock. While the executing thread owns the lock, no other thread may acquire the lock.

ThrowNode (Throw l)

A throw statement causes an exception to be thrown.

TryNode (Try l)

A try statement executes a block and may catch a thrown exception

LabeledNode (Labeled l)

Statements may have label prefixes.

Instances

HasNode Labeled StmtNode Source # 

Methods

toNode :: Labeled l -> StmtNode l Source #

HasNode Try StmtNode Source # 

Methods

toNode :: Try l -> StmtNode l Source #

HasNode Throw StmtNode Source # 

Methods

toNode :: Throw l -> StmtNode l Source #

HasNode Synchronized StmtNode Source # 
HasNode Return StmtNode Source # 

Methods

toNode :: Return l -> StmtNode l Source #

HasNode Continue StmtNode Source # 

Methods

toNode :: Continue l -> StmtNode l Source #

HasNode Break StmtNode Source # 

Methods

toNode :: Break l -> StmtNode l Source #

HasNode Do StmtNode Source # 

Methods

toNode :: Do l -> StmtNode l Source #

HasNode Switch StmtNode Source # 

Methods

toNode :: Switch l -> StmtNode l Source #

HasNode Assert StmtNode Source # 

Methods

toNode :: Assert l -> StmtNode l Source #

HasNode Empty StmtNode Source # 

Methods

toNode :: Empty l -> StmtNode l Source #

HasNode EnhancedFor StmtNode Source # 
HasNode BasicFor StmtNode Source # 

Methods

toNode :: BasicFor l -> StmtNode l Source #

HasNode While StmtNode Source # 

Methods

toNode :: While l -> StmtNode l Source #

HasNode IfThenElse StmtNode Source # 

Methods

toNode :: IfThenElse l -> StmtNode l Source #

HasNode Block StmtNode Source # 

Methods

toNode :: Block l -> StmtNode l Source #

HasNode ExpNode StmtNode Source # 

Methods

toNode :: ExpNode l -> StmtNode l Source #

HasNode StmtNode BlockStmtNode Source # 
Eq l => Eq (StmtNode l) Source # 

Methods

(==) :: StmtNode l -> StmtNode l -> Bool #

(/=) :: StmtNode l -> StmtNode l -> Bool #

Data l => Data (StmtNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StmtNode l -> c (StmtNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (StmtNode l) #

toConstr :: StmtNode l -> Constr #

dataTypeOf :: StmtNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (StmtNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (StmtNode l)) #

gmapT :: (forall b. Data b => b -> b) -> StmtNode l -> StmtNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StmtNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StmtNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> StmtNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StmtNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StmtNode l -> m (StmtNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StmtNode l -> m (StmtNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StmtNode l -> m (StmtNode l) #

Read l => Read (StmtNode l) Source # 
Show l => Show (StmtNode l) Source # 

Methods

showsPrec :: Int -> StmtNode l -> ShowS #

show :: StmtNode l -> String #

showList :: [StmtNode l] -> ShowS #

Generic (StmtNode l) Source # 

Associated Types

type Rep (StmtNode l) :: * -> * #

Methods

from :: StmtNode l -> Rep (StmtNode l) x #

to :: Rep (StmtNode l) x -> StmtNode l #

Show l => Pretty (StmtNode l) Source # 
type Rep (StmtNode l) Source # 
type Rep (StmtNode l) = D1 (MetaData "StmtNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "StmtBlockNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block l)))) (C1 (MetaCons "IfThenElseNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (IfThenElse l))))) ((:+:) (C1 (MetaCons "WhileNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (While l)))) (C1 (MetaCons "BasicForNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (BasicFor l)))))) ((:+:) ((:+:) (C1 (MetaCons "EnhancedForNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (EnhancedFor l)))) (C1 (MetaCons "EmptyNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Empty l))))) ((:+:) (C1 (MetaCons "ExpStmtNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "AssertNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Assert l))))))) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "SwitchNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Switch l)))) (C1 (MetaCons "DoNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Do l))))) ((:+:) (C1 (MetaCons "BreakNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Break l)))) (C1 (MetaCons "ContinueNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Continue l)))))) ((:+:) ((:+:) (C1 (MetaCons "ReturnNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Return l)))) (C1 (MetaCons "SynchronizedNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Synchronized l))))) ((:+:) (C1 (MetaCons "ThrowNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Throw l)))) ((:+:) (C1 (MetaCons "TryNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Try l)))) (C1 (MetaCons "LabeledNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Labeled l)))))))))

data TryResourceNode l Source #

Resource in a try-with-resources statement

Constructors

TryResourceVarNode (TryResourceVar l)

Newly declared variables

TryResourceFinalVarNode (TryResourceFinalVar l)

Effectively final variable

Instances

HasNode TryResourceFinalVar TryResourceNode Source # 
HasNode TryResourceVar TryResourceNode Source # 
Eq l => Eq (TryResourceNode l) Source # 
Data l => Data (TryResourceNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TryResourceNode l -> c (TryResourceNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TryResourceNode l) #

toConstr :: TryResourceNode l -> Constr #

dataTypeOf :: TryResourceNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (TryResourceNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TryResourceNode l)) #

gmapT :: (forall b. Data b => b -> b) -> TryResourceNode l -> TryResourceNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TryResourceNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TryResourceNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TryResourceNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TryResourceNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TryResourceNode l -> m (TryResourceNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TryResourceNode l -> m (TryResourceNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TryResourceNode l -> m (TryResourceNode l) #

Read l => Read (TryResourceNode l) Source # 
Show l => Show (TryResourceNode l) Source # 
Generic (TryResourceNode l) Source # 

Associated Types

type Rep (TryResourceNode l) :: * -> * #

Show l => Pretty (TryResourceNode l) Source # 
type Rep (TryResourceNode l) Source # 
type Rep (TryResourceNode l) = D1 (MetaData "TryResourceNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "TryResourceVarNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TryResourceVar l)))) (C1 (MetaCons "TryResourceFinalVarNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TryResourceFinalVar l)))))

data SwitchLabelNode l Source #

A label within a switch statement.

Constructors

SwitchCaseNode (ExpNode l)

The expression contained in the case must be a Lit or an enum constant.

DefaultNode l 

Instances

HasNode ExpNode SwitchLabelNode Source # 
Eq l => Eq (SwitchLabelNode l) Source # 
Data l => Data (SwitchLabelNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SwitchLabelNode l -> c (SwitchLabelNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SwitchLabelNode l) #

toConstr :: SwitchLabelNode l -> Constr #

dataTypeOf :: SwitchLabelNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (SwitchLabelNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SwitchLabelNode l)) #

gmapT :: (forall b. Data b => b -> b) -> SwitchLabelNode l -> SwitchLabelNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SwitchLabelNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SwitchLabelNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> SwitchLabelNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SwitchLabelNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SwitchLabelNode l -> m (SwitchLabelNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SwitchLabelNode l -> m (SwitchLabelNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SwitchLabelNode l -> m (SwitchLabelNode l) #

Read l => Read (SwitchLabelNode l) Source # 
Show l => Show (SwitchLabelNode l) Source # 
Generic (SwitchLabelNode l) Source # 

Associated Types

type Rep (SwitchLabelNode l) :: * -> * #

Show l => Pretty (SwitchLabelNode l) Source # 
type Rep (SwitchLabelNode l) Source # 
type Rep (SwitchLabelNode l) = D1 (MetaData "SwitchLabelNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "SwitchCaseNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "DefaultNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))))

data ForInitNode l Source #

Initialization code for a basic for statement.

Instances

HasNode ForInitExps ForInitNode Source # 
HasNode ForLocalVars ForInitNode Source # 
Eq l => Eq (ForInitNode l) Source # 
Data l => Data (ForInitNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForInitNode l -> c (ForInitNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ForInitNode l) #

toConstr :: ForInitNode l -> Constr #

dataTypeOf :: ForInitNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ForInitNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ForInitNode l)) #

gmapT :: (forall b. Data b => b -> b) -> ForInitNode l -> ForInitNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForInitNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForInitNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForInitNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForInitNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForInitNode l -> m (ForInitNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForInitNode l -> m (ForInitNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForInitNode l -> m (ForInitNode l) #

Read l => Read (ForInitNode l) Source # 
Show l => Show (ForInitNode l) Source # 
Generic (ForInitNode l) Source # 

Associated Types

type Rep (ForInitNode l) :: * -> * #

Methods

from :: ForInitNode l -> Rep (ForInitNode l) x #

to :: Rep (ForInitNode l) x -> ForInitNode l #

Show l => Pretty (ForInitNode l) Source # 
type Rep (ForInitNode l) Source # 
type Rep (ForInitNode l) = D1 (MetaData "ForInitNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "ForLocalVarsNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ForLocalVars l)))) (C1 (MetaCons "ForInitExpsNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ForInitExps l)))))

data ExpNode l Source #

A Java expression.

Constructors

LitNode (Lit l)

A literal denotes a fixed, unchanging value.

ClassLitNode (ClassLit l)

A class literal, which is an expression consisting of the name of a class, interface, array, or primitive type, or the pseudo-type void (modelled by Nothing), followed by a . and the token class.

ThisNode (This l)

The keyword this denotes a value that is a reference to the object for which the instance method was invoked, or to the object being constructed.

QualifiedThisNode (QualifiedThis l)

Any lexically enclosing instance can be referred to by explicitly qualifying the keyword this. TODO: Fix Parser here

InstanceCreationNode (InstanceCreation l)

A class instance creation expression is used to create new objects that are instances of classes. | The first argument is a list of non-wildcard type arguments to a generic constructor. What follows is the type to be instantiated, the list of arguments passed to the constructor, and optionally a class body that makes the constructor result in an object of an anonymous class.

QualInstanceCreationNode (QualInstanceCreation l)

A qualified class instance creation expression enables the creation of instances of inner member classes and their anonymous subclasses.

ArrayCreateNode (ArrayCreate l)

An array instance creation expression is used to create new arrays. The last argument denotes the number of dimensions that have no explicit length given. These dimensions must be given last.

ArrayCreateInitNode (ArrayCreateInit l)

An array instance creation expression may come with an explicit initializer. Such expressions may not be given explicit lengths for any of its dimensions.

FieldAccessNode (FieldAccessNode l)

A field access expression.

MethodInvNode (MethodInvocationNode l)

A method invocation expression.

ArrayAccessNode (ArrayIndex l)

An array access expression refers to a variable that is a component of an array.

ExpNameNode (ExpName l)

An expression name, e.g. a variable.

PostIncrementNode (ExpNode l)

Post-incrementation expression, i.e. an expression followed by ++.

PostDecrementNode (ExpNode l)

Post-decrementation expression, i.e. an expression followed by --.

PreIncrementNode (ExpNode l)

Pre-incrementation expression, i.e. an expression preceded by ++.

PreDecrementNode (ExpNode l)

Pre-decrementation expression, i.e. an expression preceded by --.

PrePlusNode (ExpNode l)

Unary plus, the promotion of the value of the expression to a primitive numeric type.

PreMinusNode (ExpNode l)

Unary minus, the promotion of the negation of the value of the expression to a primitive numeric type.

PreBitComplNode (ExpNode l)

Unary bitwise complementation: note that, in all cases, ~x equals (-x)-1.

PreNotNode (ExpNode l)

Logical complementation of boolean values.

CastNode (Cast l)

A cast expression converts, at run time, a value of one numeric type to a similar value of another numeric type; or confirms, at compile time, that the type of an expression is boolean; or checks, at run time, that a reference value refers to an object whose class is compatible with a specified reference type.

BinOpNode (BinOp l)

The application of a binary operator to two operand expressions.

InstanceOfNode (InstanceOf l)

Testing whether the result of an expression is an instance of some reference type.

CondNode (Cond l)

The conditional operator ? : uses the boolean value of one expression to decide which of two other expressions should be evaluated.

AssignNode (Assign l)

Assignment of the result of an expression to a variable.

LambdaNode (Lambda l)

Lambda expression

MethodRefNode (MethodRef l)

Method reference

Instances

HasNode ArrayIndex ExpNode Source # 

Methods

toNode :: ArrayIndex l -> ExpNode l Source #

HasNode MethodRef ExpNode Source # 

Methods

toNode :: MethodRef l -> ExpNode l Source #

HasNode Lambda ExpNode Source # 

Methods

toNode :: Lambda l -> ExpNode l Source #

HasNode Assign ExpNode Source # 

Methods

toNode :: Assign l -> ExpNode l Source #

HasNode Cond ExpNode Source # 

Methods

toNode :: Cond l -> ExpNode l Source #

HasNode InstanceOf ExpNode Source # 

Methods

toNode :: InstanceOf l -> ExpNode l Source #

HasNode BinOp ExpNode Source # 

Methods

toNode :: BinOp l -> ExpNode l Source #

HasNode Cast ExpNode Source # 

Methods

toNode :: Cast l -> ExpNode l Source #

HasNode ExpName ExpNode Source # 

Methods

toNode :: ExpName l -> ExpNode l Source #

HasNode ArrayCreateInit ExpNode Source # 
HasNode ArrayCreate ExpNode Source # 

Methods

toNode :: ArrayCreate l -> ExpNode l Source #

HasNode QualInstanceCreation ExpNode Source # 
HasNode InstanceCreation ExpNode Source # 
HasNode QualifiedThis ExpNode Source # 
HasNode This ExpNode Source # 

Methods

toNode :: This l -> ExpNode l Source #

HasNode ClassLit ExpNode Source # 

Methods

toNode :: ClassLit l -> ExpNode l Source #

HasNode Lit ExpNode Source # 

Methods

toNode :: Lit l -> ExpNode l Source #

HasNode MethodInvocationNode ExpNode Source # 
HasNode FieldAccessNode ExpNode Source # 
HasNode ExpNode LambdaExpressionNode Source # 
HasNode ExpNode SwitchLabelNode Source # 
HasNode ExpNode StmtNode Source # 

Methods

toNode :: ExpNode l -> StmtNode l Source #

HasNode ExpNode VarInitNode Source # 

Methods

toNode :: ExpNode l -> VarInitNode l Source #

Eq l => Eq (ExpNode l) Source # 

Methods

(==) :: ExpNode l -> ExpNode l -> Bool #

(/=) :: ExpNode l -> ExpNode l -> Bool #

Data l => Data (ExpNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExpNode l -> c (ExpNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ExpNode l) #

toConstr :: ExpNode l -> Constr #

dataTypeOf :: ExpNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ExpNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ExpNode l)) #

gmapT :: (forall b. Data b => b -> b) -> ExpNode l -> ExpNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExpNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExpNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExpNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExpNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExpNode l -> m (ExpNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExpNode l -> m (ExpNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExpNode l -> m (ExpNode l) #

Read l => Read (ExpNode l) Source # 
Show l => Show (ExpNode l) Source # 

Methods

showsPrec :: Int -> ExpNode l -> ShowS #

show :: ExpNode l -> String #

showList :: [ExpNode l] -> ShowS #

Generic (ExpNode l) Source # 

Associated Types

type Rep (ExpNode l) :: * -> * #

Methods

from :: ExpNode l -> Rep (ExpNode l) x #

to :: Rep (ExpNode l) x -> ExpNode l #

Show l => Pretty (ExpNode l) Source # 
type Rep (ExpNode l) Source # 
type Rep (ExpNode l) = D1 (MetaData "ExpNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "LitNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Lit l)))) ((:+:) (C1 (MetaCons "ClassLitNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ClassLit l)))) (C1 (MetaCons "ThisNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (This l)))))) ((:+:) (C1 (MetaCons "QualifiedThisNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (QualifiedThis l)))) ((:+:) (C1 (MetaCons "InstanceCreationNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (InstanceCreation l)))) (C1 (MetaCons "QualInstanceCreationNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (QualInstanceCreation l))))))) ((:+:) ((:+:) (C1 (MetaCons "ArrayCreateNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayCreate l)))) ((:+:) (C1 (MetaCons "ArrayCreateInitNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayCreateInit l)))) (C1 (MetaCons "FieldAccessNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (FieldAccessNode l)))))) ((:+:) ((:+:) (C1 (MetaCons "MethodInvNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (MethodInvocationNode l)))) (C1 (MetaCons "ArrayAccessNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayIndex l))))) ((:+:) (C1 (MetaCons "ExpNameNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpName l)))) (C1 (MetaCons "PostIncrementNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))))))) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "PostDecrementNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) ((:+:) (C1 (MetaCons "PreIncrementNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "PreDecrementNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))))) ((:+:) ((:+:) (C1 (MetaCons "PrePlusNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "PreMinusNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))))) ((:+:) (C1 (MetaCons "PreBitComplNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "PreNotNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))))))) ((:+:) ((:+:) (C1 (MetaCons "CastNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Cast l)))) ((:+:) (C1 (MetaCons "BinOpNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (BinOp l)))) (C1 (MetaCons "InstanceOfNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (InstanceOf l)))))) ((:+:) ((:+:) (C1 (MetaCons "CondNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Cond l)))) (C1 (MetaCons "AssignNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Assign l))))) ((:+:) (C1 (MetaCons "LambdaNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Lambda l)))) (C1 (MetaCons "MethodRefNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (MethodRef l)))))))))

data LhsNode l Source #

The left-hand side of an assignment expression. This operand may be a named variable, such as a local variable or a field of the current object or class, or it may be a computed variable, as can result from a field access or an array access.

Constructors

NameLhsNode (NameLhs l)

Assign to a variable

FieldLhsNode (FieldAccessNode l)

Assign through a field access

ArrayLhsNode (ArrayIndex l)

Assign to an array

Instances

HasNode ArrayIndex LhsNode Source # 

Methods

toNode :: ArrayIndex l -> LhsNode l Source #

HasNode NameLhs LhsNode Source # 

Methods

toNode :: NameLhs l -> LhsNode l Source #

HasNode FieldAccessNode LhsNode Source # 
Eq l => Eq (LhsNode l) Source # 

Methods

(==) :: LhsNode l -> LhsNode l -> Bool #

(/=) :: LhsNode l -> LhsNode l -> Bool #

Data l => Data (LhsNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LhsNode l -> c (LhsNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LhsNode l) #

toConstr :: LhsNode l -> Constr #

dataTypeOf :: LhsNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LhsNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LhsNode l)) #

gmapT :: (forall b. Data b => b -> b) -> LhsNode l -> LhsNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LhsNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LhsNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LhsNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LhsNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LhsNode l -> m (LhsNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LhsNode l -> m (LhsNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LhsNode l -> m (LhsNode l) #

Read l => Read (LhsNode l) Source # 
Show l => Show (LhsNode l) Source # 

Methods

showsPrec :: Int -> LhsNode l -> ShowS #

show :: LhsNode l -> String #

showList :: [LhsNode l] -> ShowS #

Generic (LhsNode l) Source # 

Associated Types

type Rep (LhsNode l) :: * -> * #

Methods

from :: LhsNode l -> Rep (LhsNode l) x #

to :: Rep (LhsNode l) x -> LhsNode l #

Show l => Pretty (LhsNode l) Source # 
type Rep (LhsNode l) Source # 

data FieldAccessNode l Source #

A field access expression may access a field of an object or array, a reference to which is the value of either an expression or the special keyword super.

Constructors

PrimaryFieldAccessNode (PrimaryFieldAccess l)

Accessing a field of an object or array computed from an expression.

SuperFieldAccessNode (SuperFieldAccess l)

Accessing a field of the superclass.

ClassFieldAccessNode (ClassFieldAccess l)

Accessing a (static) field of a named class.

Instances

HasNode ClassFieldAccess FieldAccessNode Source # 
HasNode SuperFieldAccess FieldAccessNode Source # 
HasNode PrimaryFieldAccess FieldAccessNode Source # 
HasNode FieldAccessNode LhsNode Source # 
HasNode FieldAccessNode ExpNode Source # 
Eq l => Eq (FieldAccessNode l) Source # 
Data l => Data (FieldAccessNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldAccessNode l -> c (FieldAccessNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FieldAccessNode l) #

toConstr :: FieldAccessNode l -> Constr #

dataTypeOf :: FieldAccessNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (FieldAccessNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FieldAccessNode l)) #

gmapT :: (forall b. Data b => b -> b) -> FieldAccessNode l -> FieldAccessNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldAccessNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldAccessNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldAccessNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldAccessNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldAccessNode l -> m (FieldAccessNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldAccessNode l -> m (FieldAccessNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldAccessNode l -> m (FieldAccessNode l) #

Read l => Read (FieldAccessNode l) Source # 
Show l => Show (FieldAccessNode l) Source # 
Generic (FieldAccessNode l) Source # 

Associated Types

type Rep (FieldAccessNode l) :: * -> * #

Show l => Pretty (FieldAccessNode l) Source # 
type Rep (FieldAccessNode l) Source # 
type Rep (FieldAccessNode l) = D1 (MetaData "FieldAccessNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "PrimaryFieldAccessNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (PrimaryFieldAccess l)))) ((:+:) (C1 (MetaCons "SuperFieldAccessNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SuperFieldAccess l)))) (C1 (MetaCons "ClassFieldAccessNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ClassFieldAccess l))))))

data LambdaParamsNode l Source #

Instances

HasNode LambdaInferredParams LambdaParamsNode Source # 
HasNode LambdaFormalParams LambdaParamsNode Source # 
HasNode LambdaSingleParam LambdaParamsNode Source # 
Eq l => Eq (LambdaParamsNode l) Source # 
Data l => Data (LambdaParamsNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LambdaParamsNode l -> c (LambdaParamsNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LambdaParamsNode l) #

toConstr :: LambdaParamsNode l -> Constr #

dataTypeOf :: LambdaParamsNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LambdaParamsNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LambdaParamsNode l)) #

gmapT :: (forall b. Data b => b -> b) -> LambdaParamsNode l -> LambdaParamsNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LambdaParamsNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LambdaParamsNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LambdaParamsNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LambdaParamsNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LambdaParamsNode l -> m (LambdaParamsNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaParamsNode l -> m (LambdaParamsNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaParamsNode l -> m (LambdaParamsNode l) #

Read l => Read (LambdaParamsNode l) Source # 
Show l => Show (LambdaParamsNode l) Source # 
Generic (LambdaParamsNode l) Source # 

Associated Types

type Rep (LambdaParamsNode l) :: * -> * #

Show l => Pretty (LambdaParamsNode l) Source # 
type Rep (LambdaParamsNode l) Source # 
type Rep (LambdaParamsNode l) = D1 (MetaData "LambdaParamsNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "LambdaSingleParamNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LambdaSingleParam l)))) ((:+:) (C1 (MetaCons "LambdaFormalParamsNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LambdaFormalParams l)))) (C1 (MetaCons "LambdaInferredParamsNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LambdaInferredParams l))))))

data LambdaExpressionNode l Source #

Lambda expression, starting from java 8

Instances

HasNode Block LambdaExpressionNode Source # 
HasNode ExpNode LambdaExpressionNode Source # 
Eq l => Eq (LambdaExpressionNode l) Source # 
Data l => Data (LambdaExpressionNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LambdaExpressionNode l -> c (LambdaExpressionNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LambdaExpressionNode l) #

toConstr :: LambdaExpressionNode l -> Constr #

dataTypeOf :: LambdaExpressionNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LambdaExpressionNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LambdaExpressionNode l)) #

gmapT :: (forall b. Data b => b -> b) -> LambdaExpressionNode l -> LambdaExpressionNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LambdaExpressionNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LambdaExpressionNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LambdaExpressionNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LambdaExpressionNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LambdaExpressionNode l -> m (LambdaExpressionNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaExpressionNode l -> m (LambdaExpressionNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaExpressionNode l -> m (LambdaExpressionNode l) #

Read l => Read (LambdaExpressionNode l) Source # 
Show l => Show (LambdaExpressionNode l) Source # 
Generic (LambdaExpressionNode l) Source # 
Show l => Pretty (LambdaExpressionNode l) Source # 
type Rep (LambdaExpressionNode l) Source # 
type Rep (LambdaExpressionNode l) = D1 (MetaData "LambdaExpressionNode" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "LambdaExpressionNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) (C1 (MetaCons "LambdaBlockNode" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block l)))))

data MethodInvocationNode l Source #

A method invocation expression is used to invoke a class or instance method.

Constructors

MethodCallNode (MethodCall l)

Invoking a specific named method.

PrimaryMethodCallNode (PrimaryMethodCall l)

Invoking a method of a class computed from a primary expression, giving arguments for any generic type parameters.

SuperMethodCallNode (SuperMethodCall l)

Invoking a method of the super class, giving arguments for any generic type parameters.

ClassMethodCallNode (ClassMethodCall l)

Invoking a method of the superclass of a named class, giving arguments for any generic type parameters.

TypeMethodCallNode (TypeMethodCall l)

Invoking a method of a named type, giving arguments for any generic type parameters.

Instances

HasNode TypeMethodCall MethodInvocationNode Source # 
HasNode ClassMethodCall MethodInvocationNode Source # 
HasNode SuperMethodCall MethodInvocationNode Source # 
HasNode PrimaryMethodCall MethodInvocationNode Source # 
HasNode MethodCall MethodInvocationNode Source # 
HasNode MethodInvocationNode ExpNode Source # 
Eq l => Eq (MethodInvocationNode l) Source # 
Data l => Data (MethodInvocationNode l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MethodInvocationNode l -> c (MethodInvocationNode l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MethodInvocationNode l) #

toConstr :: MethodInvocationNode l -> Constr #

dataTypeOf :: MethodInvocationNode l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (MethodInvocationNode l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MethodInvocationNode l)) #

gmapT :: (forall b. Data b => b -> b) -> MethodInvocationNode l -> MethodInvocationNode l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MethodInvocationNode l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MethodInvocationNode l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MethodInvocationNode l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MethodInvocationNode l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MethodInvocationNode l -> m (MethodInvocationNode l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodInvocationNode l -> m (MethodInvocationNode l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodInvocationNode l -> m (MethodInvocationNode l) #

Read l => Read (MethodInvocationNode l) Source # 
Show l => Show (MethodInvocationNode l) Source # 
Generic (MethodInvocationNode l) Source # 
Show l => Pretty (MethodInvocationNode l) Source # 
type Rep (MethodInvocationNode l) Source # 

data CompilationUnit l Source #

A compilation unit is the top level syntactic goal symbol of a Java program.

Instances

HasNode CompilationUnit CompilationUnitNode Source # 
Eq l => Eq (CompilationUnit l) Source # 
Data l => Data (CompilationUnit l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CompilationUnit l -> c (CompilationUnit l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CompilationUnit l) #

toConstr :: CompilationUnit l -> Constr #

dataTypeOf :: CompilationUnit l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (CompilationUnit l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CompilationUnit l)) #

gmapT :: (forall b. Data b => b -> b) -> CompilationUnit l -> CompilationUnit l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CompilationUnit l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CompilationUnit l -> r #

gmapQ :: (forall d. Data d => d -> u) -> CompilationUnit l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CompilationUnit l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CompilationUnit l -> m (CompilationUnit l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CompilationUnit l -> m (CompilationUnit l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CompilationUnit l -> m (CompilationUnit l) #

Read l => Read (CompilationUnit l) Source # 
Show l => Show (CompilationUnit l) Source # 
Generic (CompilationUnit l) Source # 

Associated Types

type Rep (CompilationUnit l) :: * -> * #

Show l => Pretty (CompilationUnit l) Source # 
type Rep (CompilationUnit l) Source # 
type Rep (CompilationUnit l) = D1 (MetaData "CompilationUnit" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "CompilationUnit" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoCompUnit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "packageLocation") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (PackageDecl l))))) ((:*:) (S1 (MetaSel (Just Symbol "imports") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ImportDecl l])) (S1 (MetaSel (Just Symbol "typeDecls") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [TypeDeclNode l])))))

data ModuleDeclaration l Source #

Instances

HasNode ModuleDeclaration CompilationUnitNode Source # 
Eq l => Eq (ModuleDeclaration l) Source # 
Data l => Data (ModuleDeclaration l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleDeclaration l -> c (ModuleDeclaration l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleDeclaration l) #

toConstr :: ModuleDeclaration l -> Constr #

dataTypeOf :: ModuleDeclaration l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleDeclaration l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleDeclaration l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleDeclaration l -> ModuleDeclaration l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleDeclaration l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleDeclaration l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleDeclaration l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleDeclaration l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleDeclaration l -> m (ModuleDeclaration l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleDeclaration l -> m (ModuleDeclaration l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleDeclaration l -> m (ModuleDeclaration l) #

Read l => Read (ModuleDeclaration l) Source # 
Show l => Show (ModuleDeclaration l) Source # 
Generic (ModuleDeclaration l) Source # 

Associated Types

type Rep (ModuleDeclaration l) :: * -> * #

Show l => Pretty (ModuleDeclaration l) Source # 
type Rep (ModuleDeclaration l) Source # 
type Rep (ModuleDeclaration l) = D1 (MetaData "ModuleDeclaration" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ModuleDeclaration" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoModuleDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "modulePackage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Package)) (S1 (MetaSel (Just Symbol "moduleSpecs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ModuleSpecNode l])))))

data PackageDecl l Source #

A package declaration appears within a compilation unit to indicate the package to which the compilation unit belongs.

Constructors

PackageDecl 

Instances

Eq l => Eq (PackageDecl l) Source # 
Data l => Data (PackageDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageDecl l -> c (PackageDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PackageDecl l) #

toConstr :: PackageDecl l -> Constr #

dataTypeOf :: PackageDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (PackageDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PackageDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> PackageDecl l -> PackageDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageDecl l -> m (PackageDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDecl l -> m (PackageDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDecl l -> m (PackageDecl l) #

Read l => Read (PackageDecl l) Source # 
Show l => Show (PackageDecl l) Source # 
Generic (PackageDecl l) Source # 

Associated Types

type Rep (PackageDecl l) :: * -> * #

Methods

from :: PackageDecl l -> Rep (PackageDecl l) x #

to :: Rep (PackageDecl l) x -> PackageDecl l #

Pretty (PackageDecl l) Source # 
type Rep (PackageDecl l) Source # 
type Rep (PackageDecl l) = D1 (MetaData "PackageDecl" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "PackageDecl" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoPackDec") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "packageDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Package))))

data ModuleRequires l Source #

requires the module to work

Instances

HasNode ModuleRequires ModuleSpecNode Source # 
Eq l => Eq (ModuleRequires l) Source # 
Data l => Data (ModuleRequires l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleRequires l -> c (ModuleRequires l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleRequires l) #

toConstr :: ModuleRequires l -> Constr #

dataTypeOf :: ModuleRequires l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleRequires l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleRequires l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleRequires l -> ModuleRequires l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleRequires l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleRequires l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleRequires l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleRequires l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleRequires l -> m (ModuleRequires l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleRequires l -> m (ModuleRequires l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleRequires l -> m (ModuleRequires l) #

Read l => Read (ModuleRequires l) Source # 
Show l => Show (ModuleRequires l) Source # 
Generic (ModuleRequires l) Source # 

Associated Types

type Rep (ModuleRequires l) :: * -> * #

Pretty (ModuleRequires l) Source # 
type Rep (ModuleRequires l) Source # 
type Rep (ModuleRequires l) = D1 (MetaData "ModuleRequires" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ModuleRequires" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoModuleRequires") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "requireModule") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Package))))

data ModuleExports l Source #

Exports the package

Instances

HasNode ModuleExports ModuleSpecNode Source # 
Eq l => Eq (ModuleExports l) Source # 
Data l => Data (ModuleExports l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleExports l -> c (ModuleExports l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleExports l) #

toConstr :: ModuleExports l -> Constr #

dataTypeOf :: ModuleExports l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleExports l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleExports l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleExports l -> ModuleExports l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleExports l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleExports l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleExports l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleExports l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleExports l -> m (ModuleExports l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleExports l -> m (ModuleExports l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleExports l -> m (ModuleExports l) #

Read l => Read (ModuleExports l) Source # 
Show l => Show (ModuleExports l) Source # 
Generic (ModuleExports l) Source # 

Associated Types

type Rep (ModuleExports l) :: * -> * #

Pretty (ModuleExports l) Source # 
type Rep (ModuleExports l) Source # 
type Rep (ModuleExports l) = D1 (MetaData "ModuleExports" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ModuleExports" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoModuleExports") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "exportsPackage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Package))))

data ImportDecl l Source #

An import declaration allows a static member or a named type to be referred to by a single unqualified identifier. The first argument signals whether the declaration only imports static members. The last argument signals whether the declaration brings all names in the named type or package, or only brings a single name into scope.

Instances

Eq l => Eq (ImportDecl l) Source # 

Methods

(==) :: ImportDecl l -> ImportDecl l -> Bool #

(/=) :: ImportDecl l -> ImportDecl l -> Bool #

Data l => Data (ImportDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportDecl l -> c (ImportDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImportDecl l) #

toConstr :: ImportDecl l -> Constr #

dataTypeOf :: ImportDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ImportDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImportDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> ImportDecl l -> ImportDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportDecl l -> m (ImportDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDecl l -> m (ImportDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDecl l -> m (ImportDecl l) #

Read l => Read (ImportDecl l) Source # 
Show l => Show (ImportDecl l) Source # 
Generic (ImportDecl l) Source # 

Associated Types

type Rep (ImportDecl l) :: * -> * #

Methods

from :: ImportDecl l -> Rep (ImportDecl l) x #

to :: Rep (ImportDecl l) x -> ImportDecl l #

HasType (ImportDecl l) Source # 

Methods

getType :: ImportDecl l -> Type Source #

Pretty (ImportDecl l) Source # 
type Rep (ImportDecl l) Source # 
type Rep (ImportDecl l) = D1 (MetaData "ImportDecl" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ImportDecl" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoImportDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "staticImport") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)) (S1 (MetaSel (Just Symbol "importPackage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Package)))))

data ClassDecl l Source #

A class declaration specifies a new named reference type.

Instances

HasNode ClassDecl ClassDeclNode Source # 
Eq l => Eq (ClassDecl l) Source # 

Methods

(==) :: ClassDecl l -> ClassDecl l -> Bool #

(/=) :: ClassDecl l -> ClassDecl l -> Bool #

Data l => Data (ClassDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassDecl l -> c (ClassDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassDecl l) #

toConstr :: ClassDecl l -> Constr #

dataTypeOf :: ClassDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ClassDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassDecl l -> ClassDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassDecl l -> m (ClassDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassDecl l -> m (ClassDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassDecl l -> m (ClassDecl l) #

Read l => Read (ClassDecl l) Source # 
Show l => Show (ClassDecl l) Source # 
Generic (ClassDecl l) Source # 

Associated Types

type Rep (ClassDecl l) :: * -> * #

Methods

from :: ClassDecl l -> Rep (ClassDecl l) x #

to :: Rep (ClassDecl l) x -> ClassDecl l #

CollectTypes (ClassDecl l) Source # 
HasType (ClassDecl l) Source # 

Methods

getType :: ClassDecl l -> Type Source #

Show l => Pretty (ClassDecl l) Source # 
HasBody (ClassDecl l) l Source #

Get the body of ClassDecl

Methods

getBody :: ClassDecl l -> [DeclNode l] Source #

type Rep (ClassDecl l) Source # 

data EnumDecl l Source #

Instances

HasNode EnumDecl ClassDeclNode Source # 
Eq l => Eq (EnumDecl l) Source # 

Methods

(==) :: EnumDecl l -> EnumDecl l -> Bool #

(/=) :: EnumDecl l -> EnumDecl l -> Bool #

Data l => Data (EnumDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EnumDecl l -> c (EnumDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EnumDecl l) #

toConstr :: EnumDecl l -> Constr #

dataTypeOf :: EnumDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (EnumDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EnumDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> EnumDecl l -> EnumDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EnumDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EnumDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> EnumDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EnumDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EnumDecl l -> m (EnumDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EnumDecl l -> m (EnumDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EnumDecl l -> m (EnumDecl l) #

Read l => Read (EnumDecl l) Source # 
Show l => Show (EnumDecl l) Source # 

Methods

showsPrec :: Int -> EnumDecl l -> ShowS #

show :: EnumDecl l -> String #

showList :: [EnumDecl l] -> ShowS #

Generic (EnumDecl l) Source # 

Associated Types

type Rep (EnumDecl l) :: * -> * #

Methods

from :: EnumDecl l -> Rep (EnumDecl l) x #

to :: Rep (EnumDecl l) x -> EnumDecl l #

CollectTypes (EnumDecl l) Source # 

Methods

collectTypes :: EnumDecl l -> [Type] Source #

HasType (EnumDecl l) Source # 

Methods

getType :: EnumDecl l -> Type Source #

Show l => Pretty (EnumDecl l) Source # 
HasBody (EnumDecl l) l Source # 

Methods

getBody :: EnumDecl l -> [DeclNode l] Source #

type Rep (EnumDecl l) Source # 

data Extends l Source #

An extends clause

Constructors

Extends 

Instances

Eq l => Eq (Extends l) Source # 

Methods

(==) :: Extends l -> Extends l -> Bool #

(/=) :: Extends l -> Extends l -> Bool #

Data l => Data (Extends l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Extends l -> c (Extends l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Extends l) #

toConstr :: Extends l -> Constr #

dataTypeOf :: Extends l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Extends l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Extends l)) #

gmapT :: (forall b. Data b => b -> b) -> Extends l -> Extends l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Extends l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Extends l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Extends l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Extends l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Extends l -> m (Extends l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Extends l -> m (Extends l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Extends l -> m (Extends l) #

Read l => Read (Extends l) Source # 
Show l => Show (Extends l) Source # 

Methods

showsPrec :: Int -> Extends l -> ShowS #

show :: Extends l -> String #

showList :: [Extends l] -> ShowS #

Generic (Extends l) Source # 

Associated Types

type Rep (Extends l) :: * -> * #

Methods

from :: Extends l -> Rep (Extends l) x #

to :: Rep (Extends l) x -> Extends l #

HasType (Extends l) Source # 

Methods

getType :: Extends l -> Type Source #

Show l => Pretty (Extends l) Source # 
type Rep (Extends l) Source # 
type Rep (Extends l) = D1 (MetaData "Extends" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Extends" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoExtends") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "extendsClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RefType))))

data Implements l Source #

An implements clause

Instances

Eq l => Eq (Implements l) Source # 

Methods

(==) :: Implements l -> Implements l -> Bool #

(/=) :: Implements l -> Implements l -> Bool #

Data l => Data (Implements l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Implements l -> c (Implements l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Implements l) #

toConstr :: Implements l -> Constr #

dataTypeOf :: Implements l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Implements l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Implements l)) #

gmapT :: (forall b. Data b => b -> b) -> Implements l -> Implements l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Implements l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Implements l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Implements l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Implements l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Implements l -> m (Implements l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Implements l -> m (Implements l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Implements l -> m (Implements l) #

Read l => Read (Implements l) Source # 
Show l => Show (Implements l) Source # 
Generic (Implements l) Source # 

Associated Types

type Rep (Implements l) :: * -> * #

Methods

from :: Implements l -> Rep (Implements l) x #

to :: Rep (Implements l) x -> Implements l #

HasType (Implements l) Source # 

Methods

getType :: Implements l -> Type Source #

Show l => Pretty (Implements l) Source # 
type Rep (Implements l) Source # 
type Rep (Implements l) = D1 (MetaData "Implements" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Implements" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoImplements") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "implementsInterface") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RefType))))

data ClassBody l Source #

A class body may contain declarations of members of the class, that is, fields, classes, interfaces and methods. A class body may also contain instance initializers, static initializers, and declarations of constructors for the class.

Constructors

ClassBody 

Fields

Instances

Eq l => Eq (ClassBody l) Source # 

Methods

(==) :: ClassBody l -> ClassBody l -> Bool #

(/=) :: ClassBody l -> ClassBody l -> Bool #

Data l => Data (ClassBody l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassBody l -> c (ClassBody l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassBody l) #

toConstr :: ClassBody l -> Constr #

dataTypeOf :: ClassBody l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ClassBody l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassBody l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassBody l -> ClassBody l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassBody l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassBody l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassBody l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassBody l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassBody l -> m (ClassBody l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassBody l -> m (ClassBody l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassBody l -> m (ClassBody l) #

Read l => Read (ClassBody l) Source # 
Show l => Show (ClassBody l) Source # 
Generic (ClassBody l) Source # 

Associated Types

type Rep (ClassBody l) :: * -> * #

Methods

from :: ClassBody l -> Rep (ClassBody l) x #

to :: Rep (ClassBody l) x -> ClassBody l #

Show l => Pretty (ClassBody l) Source # 
HasBody (ClassBody l) l Source #

Get the body of ClassBody

Methods

getBody :: ClassBody l -> [DeclNode l] Source #

type Rep (ClassBody l) Source # 
type Rep (ClassBody l) = D1 (MetaData "ClassBody" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ClassBody" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoClassBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "classDecls") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [DeclNode l]))))

data EnumBody l Source #

The body of an enum type may contain enum constants.

Constructors

EnumBody 

Instances

Eq l => Eq (EnumBody l) Source # 

Methods

(==) :: EnumBody l -> EnumBody l -> Bool #

(/=) :: EnumBody l -> EnumBody l -> Bool #

Data l => Data (EnumBody l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EnumBody l -> c (EnumBody l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EnumBody l) #

toConstr :: EnumBody l -> Constr #

dataTypeOf :: EnumBody l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (EnumBody l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EnumBody l)) #

gmapT :: (forall b. Data b => b -> b) -> EnumBody l -> EnumBody l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EnumBody l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EnumBody l -> r #

gmapQ :: (forall d. Data d => d -> u) -> EnumBody l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EnumBody l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EnumBody l -> m (EnumBody l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EnumBody l -> m (EnumBody l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EnumBody l -> m (EnumBody l) #

Read l => Read (EnumBody l) Source # 
Show l => Show (EnumBody l) Source # 

Methods

showsPrec :: Int -> EnumBody l -> ShowS #

show :: EnumBody l -> String #

showList :: [EnumBody l] -> ShowS #

Generic (EnumBody l) Source # 

Associated Types

type Rep (EnumBody l) :: * -> * #

Methods

from :: EnumBody l -> Rep (EnumBody l) x #

to :: Rep (EnumBody l) x -> EnumBody l #

Show l => Pretty (EnumBody l) Source # 
HasBody (EnumBody l) l Source #

Get the body of EnumBody

Methods

getBody :: EnumBody l -> [DeclNode l] Source #

type Rep (EnumBody l) Source # 
type Rep (EnumBody l) = D1 (MetaData "EnumBody" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "EnumBody" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoEnumBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "enumConstants") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [EnumConstant l])) (S1 (MetaSel (Just Symbol "enumDecls") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [DeclNode l])))))

data EnumConstant l Source #

An enum constant defines an instance of the enum type.

Instances

Eq l => Eq (EnumConstant l) Source # 
Data l => Data (EnumConstant l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EnumConstant l -> c (EnumConstant l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EnumConstant l) #

toConstr :: EnumConstant l -> Constr #

dataTypeOf :: EnumConstant l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (EnumConstant l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EnumConstant l)) #

gmapT :: (forall b. Data b => b -> b) -> EnumConstant l -> EnumConstant l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EnumConstant l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EnumConstant l -> r #

gmapQ :: (forall d. Data d => d -> u) -> EnumConstant l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EnumConstant l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EnumConstant l -> m (EnumConstant l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EnumConstant l -> m (EnumConstant l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EnumConstant l -> m (EnumConstant l) #

Read l => Read (EnumConstant l) Source # 
Show l => Show (EnumConstant l) Source # 
Generic (EnumConstant l) Source # 

Associated Types

type Rep (EnumConstant l) :: * -> * #

Methods

from :: EnumConstant l -> Rep (EnumConstant l) x #

to :: Rep (EnumConstant l) x -> EnumConstant l #

HasType (EnumConstant l) Source #

Get type of EnumConstant

Show l => Pretty (EnumConstant l) Source # 
type Rep (EnumConstant l) Source # 
type Rep (EnumConstant l) = D1 (MetaData "EnumConstant" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "EnumConstant" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoEnumConstant") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "enumConstantName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident))) ((:*:) (S1 (MetaSel (Just Symbol "enumArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])) (S1 (MetaSel (Just Symbol "enumConstantBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (ClassBody l)))))))

data InterfaceDecl l Source #

An interface declaration introduces a new reference type whose members are classes, interfaces, constants and abstract methods. This type has no implementation, but otherwise unrelated classes can implement it by providing implementations for its abstract methods.

Instances

HasNode InterfaceDecl MemberDeclNode Source # 
HasNode InterfaceDecl TypeDeclNode Source # 
Eq l => Eq (InterfaceDecl l) Source # 
Data l => Data (InterfaceDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InterfaceDecl l -> c (InterfaceDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InterfaceDecl l) #

toConstr :: InterfaceDecl l -> Constr #

dataTypeOf :: InterfaceDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (InterfaceDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InterfaceDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> InterfaceDecl l -> InterfaceDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InterfaceDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InterfaceDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InterfaceDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InterfaceDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InterfaceDecl l -> m (InterfaceDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InterfaceDecl l -> m (InterfaceDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InterfaceDecl l -> m (InterfaceDecl l) #

Read l => Read (InterfaceDecl l) Source # 
Show l => Show (InterfaceDecl l) Source # 
Generic (InterfaceDecl l) Source # 

Associated Types

type Rep (InterfaceDecl l) :: * -> * #

CollectTypes (InterfaceDecl l) Source # 
HasType (InterfaceDecl l) Source #

Get type of InterfaceDecl

Show l => Pretty (InterfaceDecl l) Source # 
HasBody (InterfaceDecl l) l Source #

Get the body of InterfaceDecl

type Rep (InterfaceDecl l) Source # 

data InterfaceKind Source #

Interface can declare either a normal interface or an annotation

Instances

Eq InterfaceKind Source # 
Data InterfaceKind Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InterfaceKind -> c InterfaceKind #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InterfaceKind #

toConstr :: InterfaceKind -> Constr #

dataTypeOf :: InterfaceKind -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c InterfaceKind) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InterfaceKind) #

gmapT :: (forall b. Data b => b -> b) -> InterfaceKind -> InterfaceKind #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InterfaceKind -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InterfaceKind -> r #

gmapQ :: (forall d. Data d => d -> u) -> InterfaceKind -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InterfaceKind -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InterfaceKind -> m InterfaceKind #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InterfaceKind -> m InterfaceKind #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InterfaceKind -> m InterfaceKind #

Read InterfaceKind Source # 
Show InterfaceKind Source # 
Generic InterfaceKind Source # 

Associated Types

type Rep InterfaceKind :: * -> * #

type Rep InterfaceKind Source # 
type Rep InterfaceKind = D1 (MetaData "InterfaceKind" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "InterfaceNormal" PrefixI False) U1) (C1 (MetaCons "InterfaceAnnotation" PrefixI False) U1))

data InterfaceBody l Source #

The body of an interface may declare members of the interface.

Constructors

InterfaceBody 

Instances

Eq l => Eq (InterfaceBody l) Source # 
Data l => Data (InterfaceBody l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InterfaceBody l -> c (InterfaceBody l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InterfaceBody l) #

toConstr :: InterfaceBody l -> Constr #

dataTypeOf :: InterfaceBody l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (InterfaceBody l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InterfaceBody l)) #

gmapT :: (forall b. Data b => b -> b) -> InterfaceBody l -> InterfaceBody l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InterfaceBody l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InterfaceBody l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InterfaceBody l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InterfaceBody l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InterfaceBody l -> m (InterfaceBody l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InterfaceBody l -> m (InterfaceBody l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InterfaceBody l -> m (InterfaceBody l) #

Read l => Read (InterfaceBody l) Source # 
Show l => Show (InterfaceBody l) Source # 
Generic (InterfaceBody l) Source # 

Associated Types

type Rep (InterfaceBody l) :: * -> * #

Show l => Pretty (InterfaceBody l) Source # 
HasBody (InterfaceBody l) l Source #

Get the body of ClassDecl

type Rep (InterfaceBody l) Source # 
type Rep (InterfaceBody l) = D1 (MetaData "InterfaceBody" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "InterfaceBody" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoInterfaceBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "members") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [MemberDeclNode l]))))

data InitDecl l Source #

A declaration is either a member declaration, or a declaration of an initializer, which may be static.

Constructors

InitDecl 

Instances

HasNode InitDecl DeclNode Source # 

Methods

toNode :: InitDecl l -> DeclNode l Source #

Eq l => Eq (InitDecl l) Source # 

Methods

(==) :: InitDecl l -> InitDecl l -> Bool #

(/=) :: InitDecl l -> InitDecl l -> Bool #

Data l => Data (InitDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InitDecl l -> c (InitDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InitDecl l) #

toConstr :: InitDecl l -> Constr #

dataTypeOf :: InitDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (InitDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InitDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> InitDecl l -> InitDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InitDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InitDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InitDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InitDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InitDecl l -> m (InitDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InitDecl l -> m (InitDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InitDecl l -> m (InitDecl l) #

Read l => Read (InitDecl l) Source # 
Show l => Show (InitDecl l) Source # 

Methods

showsPrec :: Int -> InitDecl l -> ShowS #

show :: InitDecl l -> String #

showList :: [InitDecl l] -> ShowS #

Generic (InitDecl l) Source # 

Associated Types

type Rep (InitDecl l) :: * -> * #

Methods

from :: InitDecl l -> Rep (InitDecl l) x #

to :: Rep (InitDecl l) x -> InitDecl l #

Show l => Pretty (InitDecl l) Source # 
type Rep (InitDecl l) Source # 
type Rep (InitDecl l) = D1 (MetaData "InitDecl" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "InitDecl" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoInitDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "staticDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)) (S1 (MetaSel (Just Symbol "statements") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block l))))))

data FieldDecl l Source #

The variables of a class type are introduced by field declarations.

Example:

>>> parseCompilationUnit "public class MyClass {private String foo = \"Hello World\"; }"
...
__FieldDecl__ {__infoFieldDecl__ = Segment (Position 1 31) (Position 1 31), __memberDeclModifiers__ = [private], __fieldType__ =
RefType (ClassRefType (WithoutPackage (ClassName [(Ident "String",[])]))), __fieldVarDecls__ = [VarDecl {infoVarDecl =
Segment (Position 1 38) (Position 1 38), varDeclName = VarId {infoVarId = Segment (Position 1 38) (Position 1 38),
varIdName = Ident "foo"}, varInit = Just (InitExp {infoInitExp= Segment (Position 1 44) (Position 1 44), init = Lit
{infoLit = Segment (Position 1 44) (Position 1 44), literal = String "Hello World"}})}]}}]}}}]})

Instances

HasNode FieldDecl MemberDeclNode Source # 
Eq l => Eq (FieldDecl l) Source # 

Methods

(==) :: FieldDecl l -> FieldDecl l -> Bool #

(/=) :: FieldDecl l -> FieldDecl l -> Bool #

Data l => Data (FieldDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldDecl l -> c (FieldDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FieldDecl l) #

toConstr :: FieldDecl l -> Constr #

dataTypeOf :: FieldDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (FieldDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FieldDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> FieldDecl l -> FieldDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldDecl l -> m (FieldDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldDecl l -> m (FieldDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldDecl l -> m (FieldDecl l) #

Read l => Read (FieldDecl l) Source # 
Show l => Show (FieldDecl l) Source # 
Generic (FieldDecl l) Source # 

Associated Types

type Rep (FieldDecl l) :: * -> * #

Methods

from :: FieldDecl l -> Rep (FieldDecl l) x #

to :: Rep (FieldDecl l) x -> FieldDecl l #

CollectTypes (FieldDecl l) Source #

Get type of MemberDecl if it is a MethodDecl (our solution to handeling the Maybe)

Show l => Pretty (FieldDecl l) Source # 
type Rep (FieldDecl l) Source # 
type Rep (FieldDecl l) = D1 (MetaData "FieldDecl" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "FieldDecl" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoFieldDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "memberDeclModifiers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Modifier l]))) ((:*:) (S1 (MetaSel (Just Symbol "fieldType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type)) (S1 (MetaSel (Just Symbol "fieldVarDecls") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [VarDecl l])))))

data MethodDecl l Source #

A method declares executable code that can be invoked, passing a fixed number of values as arguments. Example:

>>> parseCompilationUnit "public class MyClass {private String foo() {}}"
...
[MemberDecl {infoMemberDecl = Segment (Position 1 23) (Position 1 23), member = MethodDecl {infoMethodDecl =
Segment (Position 1 31) (Position 1 31), methodDeclModifiers = [private], methodTypeParams = [], returnType =
Just (RefType (ClassRefType (WithoutPackage (ClassName [(Ident "String",[])])))), methodDeclName = Ident "foo", params = [],
exceptions = [], defaultInterfaceAnnotation = Nothing, methodBody = MethodBody {infoMethodBody = Segment (Position 1 44)
(Position 1 44), impl= Just (Block {infoBlock = Segment (Position 1 45) (Position 1 45), blockStatements = []})}}}]}}}]})

Instances

HasNode MethodDecl MemberDeclNode Source # 
Eq l => Eq (MethodDecl l) Source # 

Methods

(==) :: MethodDecl l -> MethodDecl l -> Bool #

(/=) :: MethodDecl l -> MethodDecl l -> Bool #

Data l => Data (MethodDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MethodDecl l -> c (MethodDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MethodDecl l) #

toConstr :: MethodDecl l -> Constr #

dataTypeOf :: MethodDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (MethodDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MethodDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> MethodDecl l -> MethodDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MethodDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MethodDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MethodDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MethodDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MethodDecl l -> m (MethodDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodDecl l -> m (MethodDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodDecl l -> m (MethodDecl l) #

Read l => Read (MethodDecl l) Source # 
Show l => Show (MethodDecl l) Source # 
Generic (MethodDecl l) Source # 

Associated Types

type Rep (MethodDecl l) :: * -> * #

Methods

from :: MethodDecl l -> Rep (MethodDecl l) x #

to :: Rep (MethodDecl l) x -> MethodDecl l #

CollectTypes (MethodDecl l) Source # 
Show l => Pretty (MethodDecl l) Source # 
type Rep (MethodDecl l) Source # 

data ConstructorDecl l Source #

A constructor is used in the creation of an object that is an instance of a class.

Instances

HasNode ConstructorDecl MemberDeclNode Source # 
Eq l => Eq (ConstructorDecl l) Source # 
Data l => Data (ConstructorDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstructorDecl l -> c (ConstructorDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ConstructorDecl l) #

toConstr :: ConstructorDecl l -> Constr #

dataTypeOf :: ConstructorDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ConstructorDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ConstructorDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> ConstructorDecl l -> ConstructorDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstructorDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstructorDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstructorDecl l -> m (ConstructorDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorDecl l -> m (ConstructorDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorDecl l -> m (ConstructorDecl l) #

Read l => Read (ConstructorDecl l) Source # 
Show l => Show (ConstructorDecl l) Source # 
Generic (ConstructorDecl l) Source # 

Associated Types

type Rep (ConstructorDecl l) :: * -> * #

Show l => Pretty (ConstructorDecl l) Source # 
type Rep (ConstructorDecl l) Source # 
type Rep (ConstructorDecl l) = D1 (MetaData "ConstructorDecl" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ConstructorDecl" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoConstructorDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "constructorMod") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Modifier l])) (S1 (MetaSel (Just Symbol "constructorTypeParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [TypeParam])))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "constructorClassName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) (S1 (MetaSel (Just Symbol "constructorFormalParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FormalParam l]))) ((:*:) (S1 (MetaSel (Just Symbol "constructorExceptions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ExceptionType l])) (S1 (MetaSel (Just Symbol "constructorBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ConstructorBody l)))))))

data VarDecl l Source #

A declaration of a variable, which may be explicitly initialized.

Constructors

VarDecl 

Instances

Eq l => Eq (VarDecl l) Source # 

Methods

(==) :: VarDecl l -> VarDecl l -> Bool #

(/=) :: VarDecl l -> VarDecl l -> Bool #

Data l => Data (VarDecl l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VarDecl l -> c (VarDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VarDecl l) #

toConstr :: VarDecl l -> Constr #

dataTypeOf :: VarDecl l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VarDecl l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VarDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> VarDecl l -> VarDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VarDecl l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VarDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> VarDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VarDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VarDecl l -> m (VarDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VarDecl l -> m (VarDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VarDecl l -> m (VarDecl l) #

Read l => Read (VarDecl l) Source # 
Show l => Show (VarDecl l) Source # 

Methods

showsPrec :: Int -> VarDecl l -> ShowS #

show :: VarDecl l -> String #

showList :: [VarDecl l] -> ShowS #

Generic (VarDecl l) Source # 

Associated Types

type Rep (VarDecl l) :: * -> * #

Methods

from :: VarDecl l -> Rep (VarDecl l) x #

to :: Rep (VarDecl l) x -> VarDecl l #

Show l => Pretty (VarDecl l) Source # 
type Rep (VarDecl l) Source # 
type Rep (VarDecl l) = D1 (MetaData "VarDecl" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "VarDecl" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoVarDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "varDeclName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (VarDeclIdNode l))) (S1 (MetaSel (Just Symbol "varInit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (VarInitNode l)))))))

data VarId l Source #

The name of a variable in a declaration, which may be an array.

Constructors

VarId 

Fields

Instances

HasNode VarId VarDeclIdNode Source # 

Methods

toNode :: VarId l -> VarDeclIdNode l Source #

Eq l => Eq (VarId l) Source # 

Methods

(==) :: VarId l -> VarId l -> Bool #

(/=) :: VarId l -> VarId l -> Bool #

Data l => Data (VarId l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VarId l -> c (VarId l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VarId l) #

toConstr :: VarId l -> Constr #

dataTypeOf :: VarId l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (VarId l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VarId l)) #

gmapT :: (forall b. Data b => b -> b) -> VarId l -> VarId l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VarId l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VarId l -> r #

gmapQ :: (forall d. Data d => d -> u) -> VarId l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VarId l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VarId l -> m (VarId l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VarId l -> m (VarId l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VarId l -> m (VarId l) #

Read l => Read (VarId l) Source # 
Show l => Show (VarId l) Source # 

Methods

showsPrec :: Int -> VarId l -> ShowS #

show :: VarId l -> String #

showList :: [VarId l] -> ShowS #

Generic (VarId l) Source # 

Associated Types

type Rep (VarId l) :: * -> * #

Methods

from :: VarId l -> Rep (VarId l) x #

to :: Rep (VarId l) x -> VarId l #

Pretty (VarId l) Source # 

Methods

pretty :: VarId l -> Doc Source #

prettyPrec :: Int -> VarId l -> Doc Source #

type Rep (VarId l) Source # 
type Rep (VarId l) = D1 (MetaData "VarId" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "VarId" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoVarId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "varIdName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident))))

data FormalParam l Source #

A formal parameter in method declaration. The last parameter for a given declaration may be marked as variable arity, indicated by the boolean argument.

Instances

Eq l => Eq (FormalParam l) Source # 
Data l => Data (FormalParam l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FormalParam l -> c (FormalParam l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FormalParam l) #

toConstr :: FormalParam l -> Constr #

dataTypeOf :: FormalParam l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (FormalParam l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FormalParam l)) #

gmapT :: (forall b. Data b => b -> b) -> FormalParam l -> FormalParam l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FormalParam l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FormalParam l -> r #

gmapQ :: (forall d. Data d => d -> u) -> FormalParam l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FormalParam l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FormalParam l -> m (FormalParam l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FormalParam l -> m (FormalParam l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FormalParam l -> m (FormalParam l) #

Read l => Read (FormalParam l) Source # 
Show l => Show (FormalParam l) Source # 
Generic (FormalParam l) Source # 

Associated Types

type Rep (FormalParam l) :: * -> * #

Methods

from :: FormalParam l -> Rep (FormalParam l) x #

to :: Rep (FormalParam l) x -> FormalParam l #

HasType (FormalParam l) Source #

Gets type of FormalParam

Show l => Pretty (FormalParam l) Source # 
type Rep (FormalParam l) Source # 
type Rep (FormalParam l) = D1 (MetaData "FormalParam" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "FormalParam" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoFormalParam") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "formalParamModifiers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Modifier l]))) ((:*:) (S1 (MetaSel (Just Symbol "paramType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type)) ((:*:) (S1 (MetaSel (Just Symbol "variableArity") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Bool)) (S1 (MetaSel (Just Symbol "paramName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (VarDeclIdNode l)))))))

data MethodBody l Source #

A method body is either a block of code that implements the method or simply a semicolon, indicating the lack of an implementation (modelled by Nothing).

Constructors

MethodBody 

Fields

Instances

Eq l => Eq (MethodBody l) Source # 

Methods

(==) :: MethodBody l -> MethodBody l -> Bool #

(/=) :: MethodBody l -> MethodBody l -> Bool #

Data l => Data (MethodBody l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MethodBody l -> c (MethodBody l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MethodBody l) #

toConstr :: MethodBody l -> Constr #

dataTypeOf :: MethodBody l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (MethodBody l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MethodBody l)) #

gmapT :: (forall b. Data b => b -> b) -> MethodBody l -> MethodBody l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MethodBody l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MethodBody l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MethodBody l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MethodBody l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MethodBody l -> m (MethodBody l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodBody l -> m (MethodBody l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodBody l -> m (MethodBody l) #

Read l => Read (MethodBody l) Source # 
Show l => Show (MethodBody l) Source # 
Generic (MethodBody l) Source # 

Associated Types

type Rep (MethodBody l) :: * -> * #

Methods

from :: MethodBody l -> Rep (MethodBody l) x #

to :: Rep (MethodBody l) x -> MethodBody l #

Show l => Pretty (MethodBody l) Source # 
type Rep (MethodBody l) Source # 
type Rep (MethodBody l) = D1 (MetaData "MethodBody" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "MethodBody" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoMethodBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "impl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Block l))))))

data ConstructorBody l Source #

The first statement of a constructor body may be an explicit invocation of another constructor of the same class or of the direct superclass.

Instances

Eq l => Eq (ConstructorBody l) Source # 
Data l => Data (ConstructorBody l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstructorBody l -> c (ConstructorBody l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ConstructorBody l) #

toConstr :: ConstructorBody l -> Constr #

dataTypeOf :: ConstructorBody l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ConstructorBody l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ConstructorBody l)) #

gmapT :: (forall b. Data b => b -> b) -> ConstructorBody l -> ConstructorBody l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorBody l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorBody l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstructorBody l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstructorBody l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstructorBody l -> m (ConstructorBody l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorBody l -> m (ConstructorBody l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorBody l -> m (ConstructorBody l) #

Read l => Read (ConstructorBody l) Source # 
Show l => Show (ConstructorBody l) Source # 
Generic (ConstructorBody l) Source # 

Associated Types

type Rep (ConstructorBody l) :: * -> * #

Show l => Pretty (ConstructorBody l) Source # 
type Rep (ConstructorBody l) Source # 
type Rep (ConstructorBody l) = D1 (MetaData "ConstructorBody" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ConstructorBody" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoConstructorBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "constructorInvoc") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (ExplConstrInvNode l)))) (S1 (MetaSel (Just Symbol "constrBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [BlockStmtNode l])))))

data ThisInvoke l Source #

An explicit constructor invocation invokes another constructor of the same class, or a constructor of the direct superclass, which may be qualified to explicitly specify the newly created object's immediately enclosing instance.

Instances

HasNode ThisInvoke ExplConstrInvNode Source # 
Eq l => Eq (ThisInvoke l) Source # 

Methods

(==) :: ThisInvoke l -> ThisInvoke l -> Bool #

(/=) :: ThisInvoke l -> ThisInvoke l -> Bool #

Data l => Data (ThisInvoke l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ThisInvoke l -> c (ThisInvoke l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ThisInvoke l) #

toConstr :: ThisInvoke l -> Constr #

dataTypeOf :: ThisInvoke l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ThisInvoke l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ThisInvoke l)) #

gmapT :: (forall b. Data b => b -> b) -> ThisInvoke l -> ThisInvoke l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ThisInvoke l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ThisInvoke l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ThisInvoke l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ThisInvoke l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ThisInvoke l -> m (ThisInvoke l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ThisInvoke l -> m (ThisInvoke l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ThisInvoke l -> m (ThisInvoke l) #

Read l => Read (ThisInvoke l) Source # 
Show l => Show (ThisInvoke l) Source # 
Generic (ThisInvoke l) Source # 

Associated Types

type Rep (ThisInvoke l) :: * -> * #

Methods

from :: ThisInvoke l -> Rep (ThisInvoke l) x #

to :: Rep (ThisInvoke l) x -> ThisInvoke l #

Show l => Pretty (ThisInvoke l) Source # 
type Rep (ThisInvoke l) Source # 
type Rep (ThisInvoke l) = D1 (MetaData "ThisInvoke" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ThisInvoke" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoThisInvoke") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "thisTypeArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType])) (S1 (MetaSel (Just Symbol "thisConstrArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])))))

data SuperInvoke l Source #

Instances

HasNode SuperInvoke ExplConstrInvNode Source # 
Eq l => Eq (SuperInvoke l) Source # 
Data l => Data (SuperInvoke l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SuperInvoke l -> c (SuperInvoke l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SuperInvoke l) #

toConstr :: SuperInvoke l -> Constr #

dataTypeOf :: SuperInvoke l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (SuperInvoke l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SuperInvoke l)) #

gmapT :: (forall b. Data b => b -> b) -> SuperInvoke l -> SuperInvoke l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SuperInvoke l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SuperInvoke l -> r #

gmapQ :: (forall d. Data d => d -> u) -> SuperInvoke l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SuperInvoke l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SuperInvoke l -> m (SuperInvoke l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SuperInvoke l -> m (SuperInvoke l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SuperInvoke l -> m (SuperInvoke l) #

Read l => Read (SuperInvoke l) Source # 
Show l => Show (SuperInvoke l) Source # 
Generic (SuperInvoke l) Source # 

Associated Types

type Rep (SuperInvoke l) :: * -> * #

Methods

from :: SuperInvoke l -> Rep (SuperInvoke l) x #

to :: Rep (SuperInvoke l) x -> SuperInvoke l #

Show l => Pretty (SuperInvoke l) Source # 
type Rep (SuperInvoke l) Source # 
type Rep (SuperInvoke l) = D1 (MetaData "SuperInvoke" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "SuperInvoke" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoSuperInvoke") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "superTypeArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType])) (S1 (MetaSel (Just Symbol "superConstrArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])))))

data PrimarySuperInvoke l Source #

Instances

HasNode PrimarySuperInvoke ExplConstrInvNode Source # 
Eq l => Eq (PrimarySuperInvoke l) Source # 
Data l => Data (PrimarySuperInvoke l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrimarySuperInvoke l -> c (PrimarySuperInvoke l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PrimarySuperInvoke l) #

toConstr :: PrimarySuperInvoke l -> Constr #

dataTypeOf :: PrimarySuperInvoke l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (PrimarySuperInvoke l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PrimarySuperInvoke l)) #

gmapT :: (forall b. Data b => b -> b) -> PrimarySuperInvoke l -> PrimarySuperInvoke l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrimarySuperInvoke l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrimarySuperInvoke l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrimarySuperInvoke l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrimarySuperInvoke l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrimarySuperInvoke l -> m (PrimarySuperInvoke l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimarySuperInvoke l -> m (PrimarySuperInvoke l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimarySuperInvoke l -> m (PrimarySuperInvoke l) #

Read l => Read (PrimarySuperInvoke l) Source # 
Show l => Show (PrimarySuperInvoke l) Source # 
Generic (PrimarySuperInvoke l) Source # 

Associated Types

type Rep (PrimarySuperInvoke l) :: * -> * #

Show l => Pretty (PrimarySuperInvoke l) Source # 
type Rep (PrimarySuperInvoke l) Source # 
type Rep (PrimarySuperInvoke l) = D1 (MetaData "PrimarySuperInvoke" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "PrimarySuperInvoke" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoPrimarySuperInvoke") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "primary") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) ((:*:) (S1 (MetaSel (Just Symbol "primaryTypeArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType])) (S1 (MetaSel (Just Symbol "primaryConstrArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])))))

data Modifier l Source #

A modifier specifying properties of a given declaration. In general only a few of these modifiers are allowed for each declaration type, for instance a member type declaration may only specify one of public, private or protected.

Instances

HasNode Annotation Modifier Source # 

Methods

toNode :: Annotation l -> Modifier l Source #

Eq l => Eq (Modifier l) Source # 

Methods

(==) :: Modifier l -> Modifier l -> Bool #

(/=) :: Modifier l -> Modifier l -> Bool #

Data l => Data (Modifier l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Modifier l -> c (Modifier l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Modifier l) #

toConstr :: Modifier l -> Constr #

dataTypeOf :: Modifier l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Modifier l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Modifier l)) #

gmapT :: (forall b. Data b => b -> b) -> Modifier l -> Modifier l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Modifier l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Modifier l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Modifier l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Modifier l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Modifier l -> m (Modifier l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Modifier l -> m (Modifier l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Modifier l -> m (Modifier l) #

Read l => Read (Modifier l) Source # 
Show l => Show (Modifier l) Source # 

Methods

showsPrec :: Int -> Modifier l -> ShowS #

show :: Modifier l -> String #

showList :: [Modifier l] -> ShowS #

Generic (Modifier l) Source # 

Associated Types

type Rep (Modifier l) :: * -> * #

Methods

from :: Modifier l -> Rep (Modifier l) x #

to :: Rep (Modifier l) x -> Modifier l #

Show l => Pretty (Modifier l) Source # 
type Rep (Modifier l) Source # 
type Rep (Modifier l) = D1 (MetaData "Modifier" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "Public" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) ((:+:) (C1 (MetaCons "Private" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) (C1 (MetaCons "Protected" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))))) ((:+:) (C1 (MetaCons "Abstract" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) ((:+:) (C1 (MetaCons "Final" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) (C1 (MetaCons "Static" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)))))) ((:+:) ((:+:) (C1 (MetaCons "StrictFP" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) ((:+:) (C1 (MetaCons "Transient" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) (C1 (MetaCons "Volatile" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))))) ((:+:) ((:+:) (C1 (MetaCons "Native" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) (C1 (MetaCons "Annotation" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Annotation l))))) ((:+:) (C1 (MetaCons "Synchronized_" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l))) (C1 (MetaCons "DefaultModifier" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)))))))

data Annotation l Source #

Annotations have three different forms: no-parameter, single-parameter or key-value pairs

Instances

HasNode Annotation Modifier Source # 

Methods

toNode :: Annotation l -> Modifier l Source #

Eq l => Eq (Annotation l) Source # 

Methods

(==) :: Annotation l -> Annotation l -> Bool #

(/=) :: Annotation l -> Annotation l -> Bool #

Data l => Data (Annotation l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Annotation l -> c (Annotation l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Annotation l) #

toConstr :: Annotation l -> Constr #

dataTypeOf :: Annotation l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Annotation l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Annotation l)) #

gmapT :: (forall b. Data b => b -> b) -> Annotation l -> Annotation l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Annotation l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Annotation l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Annotation l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Annotation l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Annotation l -> m (Annotation l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Annotation l -> m (Annotation l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Annotation l -> m (Annotation l) #

Read l => Read (Annotation l) Source # 
Show l => Show (Annotation l) Source # 
Generic (Annotation l) Source # 

Associated Types

type Rep (Annotation l) :: * -> * #

Methods

from :: Annotation l -> Rep (Annotation l) x #

to :: Rep (Annotation l) x -> Annotation l #

Show l => Pretty (Annotation l) Source # 
type Rep (Annotation l) Source # 
type Rep (Annotation l) = D1 (MetaData "Annotation" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "NormalAnnotation" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "annName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name)) (S1 (MetaSel (Just Symbol "annKV") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Ident, ElementValue l)])))) ((:+:) (C1 (MetaCons "SingleElementAnnotation" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "annName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name)) (S1 (MetaSel (Just Symbol "annValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ElementValue l))))) (C1 (MetaCons "MarkerAnnotation" PrefixI True) (S1 (MetaSel (Just Symbol "annName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name)))))

data ElementValue l Source #

Annotations may contain annotations or (loosely) expressions

Constructors

EVVal 
EVAnn 

Fields

Instances

Eq l => Eq (ElementValue l) Source # 
Data l => Data (ElementValue l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElementValue l -> c (ElementValue l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ElementValue l) #

toConstr :: ElementValue l -> Constr #

dataTypeOf :: ElementValue l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ElementValue l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ElementValue l)) #

gmapT :: (forall b. Data b => b -> b) -> ElementValue l -> ElementValue l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElementValue l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElementValue l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElementValue l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElementValue l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElementValue l -> m (ElementValue l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElementValue l -> m (ElementValue l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElementValue l -> m (ElementValue l) #

Read l => Read (ElementValue l) Source # 
Show l => Show (ElementValue l) Source # 
Generic (ElementValue l) Source # 

Associated Types

type Rep (ElementValue l) :: * -> * #

Methods

from :: ElementValue l -> Rep (ElementValue l) x #

to :: Rep (ElementValue l) x -> ElementValue l #

Show l => Pretty (ElementValue l) Source # 
type Rep (ElementValue l) Source # 
type Rep (ElementValue l) = D1 (MetaData "ElementValue" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) ((:+:) (C1 (MetaCons "EVVal" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoEVVal") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "elementVarInit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (VarInitNode l))))) (C1 (MetaCons "EVAnn" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoEVAnn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "annotation") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Annotation l))))))

data Block l Source #

A block is a sequence of statements, local class declarations and local variable declaration statements within braces.

Constructors

Block 

Instances

HasNode Block LambdaExpressionNode Source # 
HasNode Block StmtNode Source # 

Methods

toNode :: Block l -> StmtNode l Source #

Eq l => Eq (Block l) Source # 

Methods

(==) :: Block l -> Block l -> Bool #

(/=) :: Block l -> Block l -> Bool #

Data l => Data (Block l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Block l -> c (Block l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Block l) #

toConstr :: Block l -> Constr #

dataTypeOf :: Block l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Block l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Block l)) #

gmapT :: (forall b. Data b => b -> b) -> Block l -> Block l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Block l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Block l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Block l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Block l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Block l -> m (Block l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Block l -> m (Block l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Block l -> m (Block l) #

Read l => Read (Block l) Source # 
Show l => Show (Block l) Source # 

Methods

showsPrec :: Int -> Block l -> ShowS #

show :: Block l -> String #

showList :: [Block l] -> ShowS #

Generic (Block l) Source # 

Associated Types

type Rep (Block l) :: * -> * #

Methods

from :: Block l -> Rep (Block l) x #

to :: Rep (Block l) x -> Block l #

Show l => Pretty (Block l) Source # 

Methods

pretty :: Block l -> Doc Source #

prettyPrec :: Int -> Block l -> Doc Source #

type Rep (Block l) Source # 
type Rep (Block l) = D1 (MetaData "Block" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Block" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoBlock") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "blockStatements") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [BlockStmtNode l]))))

data LocalVars l Source #

A block statement is either a normal statement, a local class declaration or a local variable declaration.

Instances

HasNode LocalVars BlockStmtNode Source # 
Eq l => Eq (LocalVars l) Source # 

Methods

(==) :: LocalVars l -> LocalVars l -> Bool #

(/=) :: LocalVars l -> LocalVars l -> Bool #

Data l => Data (LocalVars l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalVars l -> c (LocalVars l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LocalVars l) #

toConstr :: LocalVars l -> Constr #

dataTypeOf :: LocalVars l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LocalVars l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LocalVars l)) #

gmapT :: (forall b. Data b => b -> b) -> LocalVars l -> LocalVars l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalVars l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalVars l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LocalVars l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalVars l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalVars l -> m (LocalVars l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalVars l -> m (LocalVars l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalVars l -> m (LocalVars l) #

Read l => Read (LocalVars l) Source # 
Show l => Show (LocalVars l) Source # 
Generic (LocalVars l) Source # 

Associated Types

type Rep (LocalVars l) :: * -> * #

Methods

from :: LocalVars l -> Rep (LocalVars l) x #

to :: Rep (LocalVars l) x -> LocalVars l #

Show l => Pretty (LocalVars l) Source # 
type Rep (LocalVars l) Source # 
type Rep (LocalVars l) = D1 (MetaData "LocalVars" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "LocalVars" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoLocalVars") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "locaVarModifiers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Modifier l]))) ((:*:) (S1 (MetaSel (Just Symbol "blockVarType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type)) (S1 (MetaSel (Just Symbol "localVarDecls") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [VarDecl l])))))

data IfThenElse l Source #

The if-then statement allows conditional execution of a statement.

Constructors

IfThenElse 

Instances

HasNode IfThenElse StmtNode Source # 

Methods

toNode :: IfThenElse l -> StmtNode l Source #

Eq l => Eq (IfThenElse l) Source # 

Methods

(==) :: IfThenElse l -> IfThenElse l -> Bool #

(/=) :: IfThenElse l -> IfThenElse l -> Bool #

Data l => Data (IfThenElse l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IfThenElse l -> c (IfThenElse l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IfThenElse l) #

toConstr :: IfThenElse l -> Constr #

dataTypeOf :: IfThenElse l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (IfThenElse l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IfThenElse l)) #

gmapT :: (forall b. Data b => b -> b) -> IfThenElse l -> IfThenElse l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IfThenElse l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IfThenElse l -> r #

gmapQ :: (forall d. Data d => d -> u) -> IfThenElse l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IfThenElse l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IfThenElse l -> m (IfThenElse l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IfThenElse l -> m (IfThenElse l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IfThenElse l -> m (IfThenElse l) #

Read l => Read (IfThenElse l) Source # 
Show l => Show (IfThenElse l) Source # 
Generic (IfThenElse l) Source # 

Associated Types

type Rep (IfThenElse l) :: * -> * #

Methods

from :: IfThenElse l -> Rep (IfThenElse l) x #

to :: Rep (IfThenElse l) x -> IfThenElse l #

Show l => Pretty (IfThenElse l) Source # 
type Rep (IfThenElse l) Source # 
type Rep (IfThenElse l) = D1 (MetaData "IfThenElse" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "IfThenElse" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoIfThenElse") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "ifExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) ((:*:) (S1 (MetaSel (Just Symbol "thenExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StmtNode l))) (S1 (MetaSel (Just Symbol "elseExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (StmtNode l)))))))

data While l Source #

The while statement executes an expression and a statement repeatedly until the value of the expression is false.

Constructors

While 

Instances

HasNode While StmtNode Source # 

Methods

toNode :: While l -> StmtNode l Source #

Eq l => Eq (While l) Source # 

Methods

(==) :: While l -> While l -> Bool #

(/=) :: While l -> While l -> Bool #

Data l => Data (While l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> While l -> c (While l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (While l) #

toConstr :: While l -> Constr #

dataTypeOf :: While l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (While l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (While l)) #

gmapT :: (forall b. Data b => b -> b) -> While l -> While l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> While l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> While l -> r #

gmapQ :: (forall d. Data d => d -> u) -> While l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> While l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> While l -> m (While l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> While l -> m (While l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> While l -> m (While l) #

Read l => Read (While l) Source # 
Show l => Show (While l) Source # 

Methods

showsPrec :: Int -> While l -> ShowS #

show :: While l -> String #

showList :: [While l] -> ShowS #

Generic (While l) Source # 

Associated Types

type Rep (While l) :: * -> * #

Methods

from :: While l -> Rep (While l) x #

to :: Rep (While l) x -> While l #

Show l => Pretty (While l) Source # 

Methods

pretty :: While l -> Doc Source #

prettyPrec :: Int -> While l -> Doc Source #

type Rep (While l) Source # 
type Rep (While l) = D1 (MetaData "While" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "While" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoWhile") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "whileVondition") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "whileBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StmtNode l))))))

data BasicFor l Source #

The basic for statement executes some initialization code, then executes an expression, a statement, and some update code repeatedly until the value of the expression is false.

Instances

HasNode BasicFor StmtNode Source # 

Methods

toNode :: BasicFor l -> StmtNode l Source #

Eq l => Eq (BasicFor l) Source # 

Methods

(==) :: BasicFor l -> BasicFor l -> Bool #

(/=) :: BasicFor l -> BasicFor l -> Bool #

Data l => Data (BasicFor l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicFor l -> c (BasicFor l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BasicFor l) #

toConstr :: BasicFor l -> Constr #

dataTypeOf :: BasicFor l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (BasicFor l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BasicFor l)) #

gmapT :: (forall b. Data b => b -> b) -> BasicFor l -> BasicFor l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicFor l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicFor l -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicFor l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicFor l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicFor l -> m (BasicFor l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicFor l -> m (BasicFor l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicFor l -> m (BasicFor l) #

Read l => Read (BasicFor l) Source # 
Show l => Show (BasicFor l) Source # 

Methods

showsPrec :: Int -> BasicFor l -> ShowS #

show :: BasicFor l -> String #

showList :: [BasicFor l] -> ShowS #

Generic (BasicFor l) Source # 

Associated Types

type Rep (BasicFor l) :: * -> * #

Methods

from :: BasicFor l -> Rep (BasicFor l) x #

to :: Rep (BasicFor l) x -> BasicFor l #

Show l => Pretty (BasicFor l) Source # 
type Rep (BasicFor l) Source # 

data EnhancedFor l Source #

The enhanced for statement iterates over an array or a value of a class that implements the iterator interface.

Constructors

EnhancedFor 

Fields

Instances

HasNode EnhancedFor StmtNode Source # 
Eq l => Eq (EnhancedFor l) Source # 
Data l => Data (EnhancedFor l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EnhancedFor l -> c (EnhancedFor l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EnhancedFor l) #

toConstr :: EnhancedFor l -> Constr #

dataTypeOf :: EnhancedFor l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (EnhancedFor l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EnhancedFor l)) #

gmapT :: (forall b. Data b => b -> b) -> EnhancedFor l -> EnhancedFor l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EnhancedFor l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EnhancedFor l -> r #

gmapQ :: (forall d. Data d => d -> u) -> EnhancedFor l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EnhancedFor l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EnhancedFor l -> m (EnhancedFor l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EnhancedFor l -> m (EnhancedFor l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EnhancedFor l -> m (EnhancedFor l) #

Read l => Read (EnhancedFor l) Source # 
Show l => Show (EnhancedFor l) Source # 
Generic (EnhancedFor l) Source # 

Associated Types

type Rep (EnhancedFor l) :: * -> * #

Methods

from :: EnhancedFor l -> Rep (EnhancedFor l) x #

to :: Rep (EnhancedFor l) x -> EnhancedFor l #

Show l => Pretty (EnhancedFor l) Source # 
type Rep (EnhancedFor l) Source # 

newtype Empty l Source #

An empty statement does nothing.

Constructors

Empty 

Fields

Instances

HasNode Empty StmtNode Source # 

Methods

toNode :: Empty l -> StmtNode l Source #

Eq l => Eq (Empty l) Source # 

Methods

(==) :: Empty l -> Empty l -> Bool #

(/=) :: Empty l -> Empty l -> Bool #

Data l => Data (Empty l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Empty l -> c (Empty l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Empty l) #

toConstr :: Empty l -> Constr #

dataTypeOf :: Empty l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Empty l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Empty l)) #

gmapT :: (forall b. Data b => b -> b) -> Empty l -> Empty l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Empty l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Empty l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Empty l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Empty l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Empty l -> m (Empty l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Empty l -> m (Empty l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Empty l -> m (Empty l) #

Read l => Read (Empty l) Source # 
Show l => Show (Empty l) Source # 

Methods

showsPrec :: Int -> Empty l -> ShowS #

show :: Empty l -> String #

showList :: [Empty l] -> ShowS #

Generic (Empty l) Source # 

Associated Types

type Rep (Empty l) :: * -> * #

Methods

from :: Empty l -> Rep (Empty l) x #

to :: Rep (Empty l) x -> Empty l #

Show l => Pretty (Empty l) Source # 

Methods

pretty :: Empty l -> Doc Source #

prettyPrec :: Int -> Empty l -> Doc Source #

type Rep (Empty l) Source # 
type Rep (Empty l) = D1 (MetaData "Empty" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" True) (C1 (MetaCons "Empty" PrefixI True) (S1 (MetaSel (Just Symbol "infoEmpty") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)))

data Assert l Source #

An assertion is a statement containing a boolean expression, where an error is reported if the expression evaluates to false.

Constructors

Assert 

Fields

Instances

HasNode Assert StmtNode Source # 

Methods

toNode :: Assert l -> StmtNode l Source #

Eq l => Eq (Assert l) Source # 

Methods

(==) :: Assert l -> Assert l -> Bool #

(/=) :: Assert l -> Assert l -> Bool #

Data l => Data (Assert l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Assert l -> c (Assert l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Assert l) #

toConstr :: Assert l -> Constr #

dataTypeOf :: Assert l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Assert l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Assert l)) #

gmapT :: (forall b. Data b => b -> b) -> Assert l -> Assert l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Assert l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Assert l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Assert l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Assert l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Assert l -> m (Assert l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Assert l -> m (Assert l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Assert l -> m (Assert l) #

Read l => Read (Assert l) Source # 
Show l => Show (Assert l) Source # 

Methods

showsPrec :: Int -> Assert l -> ShowS #

show :: Assert l -> String #

showList :: [Assert l] -> ShowS #

Generic (Assert l) Source # 

Associated Types

type Rep (Assert l) :: * -> * #

Methods

from :: Assert l -> Rep (Assert l) x #

to :: Rep (Assert l) x -> Assert l #

Show l => Pretty (Assert l) Source # 

Methods

pretty :: Assert l -> Doc Source #

prettyPrec :: Int -> Assert l -> Doc Source #

type Rep (Assert l) Source # 
type Rep (Assert l) = D1 (MetaData "Assert" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Assert" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoAssert") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "booleanExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "valueExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (ExpNode l)))))))

data Switch l Source #

The switch statement transfers control to one of several statements depending on the value of an expression.

Constructors

Switch 

Instances

HasNode Switch StmtNode Source # 

Methods

toNode :: Switch l -> StmtNode l Source #

Eq l => Eq (Switch l) Source # 

Methods

(==) :: Switch l -> Switch l -> Bool #

(/=) :: Switch l -> Switch l -> Bool #

Data l => Data (Switch l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Switch l -> c (Switch l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Switch l) #

toConstr :: Switch l -> Constr #

dataTypeOf :: Switch l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Switch l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Switch l)) #

gmapT :: (forall b. Data b => b -> b) -> Switch l -> Switch l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Switch l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Switch l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Switch l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Switch l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Switch l -> m (Switch l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Switch l -> m (Switch l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Switch l -> m (Switch l) #

Read l => Read (Switch l) Source # 
Show l => Show (Switch l) Source # 

Methods

showsPrec :: Int -> Switch l -> ShowS #

show :: Switch l -> String #

showList :: [Switch l] -> ShowS #

Generic (Switch l) Source # 

Associated Types

type Rep (Switch l) :: * -> * #

Methods

from :: Switch l -> Rep (Switch l) x #

to :: Rep (Switch l) x -> Switch l #

Show l => Pretty (Switch l) Source # 

Methods

pretty :: Switch l -> Doc Source #

prettyPrec :: Int -> Switch l -> Doc Source #

type Rep (Switch l) Source # 
type Rep (Switch l) = D1 (MetaData "Switch" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Switch" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoSwitch") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "switchValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "switchBlocks") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [SwitchBlock l])))))

data Do l Source #

The do statement executes a statement and an expression repeatedly until the value of the expression is false.

Constructors

Do 

Fields

Instances

HasNode Do StmtNode Source # 

Methods

toNode :: Do l -> StmtNode l Source #

Eq l => Eq (Do l) Source # 

Methods

(==) :: Do l -> Do l -> Bool #

(/=) :: Do l -> Do l -> Bool #

Data l => Data (Do l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Do l -> c (Do l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Do l) #

toConstr :: Do l -> Constr #

dataTypeOf :: Do l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Do l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Do l)) #

gmapT :: (forall b. Data b => b -> b) -> Do l -> Do l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Do l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Do l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Do l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Do l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Do l -> m (Do l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Do l -> m (Do l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Do l -> m (Do l) #

Read l => Read (Do l) Source # 
Show l => Show (Do l) Source # 

Methods

showsPrec :: Int -> Do l -> ShowS #

show :: Do l -> String #

showList :: [Do l] -> ShowS #

Generic (Do l) Source # 

Associated Types

type Rep (Do l) :: * -> * #

Methods

from :: Do l -> Rep (Do l) x #

to :: Rep (Do l) x -> Do l #

Show l => Pretty (Do l) Source # 

Methods

pretty :: Do l -> Doc Source #

prettyPrec :: Int -> Do l -> Doc Source #

type Rep (Do l) Source # 
type Rep (Do l) = D1 (MetaData "Do" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Do" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoDo") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "doBody") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StmtNode l))) (S1 (MetaSel (Just Symbol "doCondition") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))))))

data Break l Source #

A break statement transfers control out of an enclosing statement.

Constructors

Break 

Fields

Instances

HasNode Break StmtNode Source # 

Methods

toNode :: Break l -> StmtNode l Source #

Eq l => Eq (Break l) Source # 

Methods

(==) :: Break l -> Break l -> Bool #

(/=) :: Break l -> Break l -> Bool #

Data l => Data (Break l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Break l -> c (Break l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Break l) #

toConstr :: Break l -> Constr #

dataTypeOf :: Break l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Break l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Break l)) #

gmapT :: (forall b. Data b => b -> b) -> Break l -> Break l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Break l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Break l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Break l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Break l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Break l -> m (Break l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Break l -> m (Break l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Break l -> m (Break l) #

Read l => Read (Break l) Source # 
Show l => Show (Break l) Source # 

Methods

showsPrec :: Int -> Break l -> ShowS #

show :: Break l -> String #

showList :: [Break l] -> ShowS #

Generic (Break l) Source # 

Associated Types

type Rep (Break l) :: * -> * #

Methods

from :: Break l -> Rep (Break l) x #

to :: Rep (Break l) x -> Break l #

Show l => Pretty (Break l) Source # 

Methods

pretty :: Break l -> Doc Source #

prettyPrec :: Int -> Break l -> Doc Source #

type Rep (Break l) Source # 
type Rep (Break l) = D1 (MetaData "Break" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Break" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoBreak") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "breakLabel") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Ident)))))

data Continue l Source #

A continue statement may occur only in a while, do, or for statement. Control passes to the loop-continuation point of that statement.

Constructors

Continue 

Instances

HasNode Continue StmtNode Source # 

Methods

toNode :: Continue l -> StmtNode l Source #

Eq l => Eq (Continue l) Source # 

Methods

(==) :: Continue l -> Continue l -> Bool #

(/=) :: Continue l -> Continue l -> Bool #

Data l => Data (Continue l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Continue l -> c (Continue l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Continue l) #

toConstr :: Continue l -> Constr #

dataTypeOf :: Continue l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Continue l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Continue l)) #

gmapT :: (forall b. Data b => b -> b) -> Continue l -> Continue l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Continue l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Continue l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Continue l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Continue l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Continue l -> m (Continue l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Continue l -> m (Continue l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Continue l -> m (Continue l) #

Read l => Read (Continue l) Source # 
Show l => Show (Continue l) Source # 

Methods

showsPrec :: Int -> Continue l -> ShowS #

show :: Continue l -> String #

showList :: [Continue l] -> ShowS #

Generic (Continue l) Source # 

Associated Types

type Rep (Continue l) :: * -> * #

Methods

from :: Continue l -> Rep (Continue l) x #

to :: Rep (Continue l) x -> Continue l #

Show l => Pretty (Continue l) Source # 
type Rep (Continue l) Source # 
type Rep (Continue l) = D1 (MetaData "Continue" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Continue" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoContinue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "continueLabel") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Ident)))))

data Return l Source #

A return statement returns control to the invoker of a method or constructor.

Constructors

Return 

Fields

Instances

HasNode Return StmtNode Source # 

Methods

toNode :: Return l -> StmtNode l Source #

Eq l => Eq (Return l) Source # 

Methods

(==) :: Return l -> Return l -> Bool #

(/=) :: Return l -> Return l -> Bool #

Data l => Data (Return l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Return l -> c (Return l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Return l) #

toConstr :: Return l -> Constr #

dataTypeOf :: Return l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Return l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Return l)) #

gmapT :: (forall b. Data b => b -> b) -> Return l -> Return l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Return l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Return l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Return l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Return l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Return l -> m (Return l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Return l -> m (Return l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Return l -> m (Return l) #

Read l => Read (Return l) Source # 
Show l => Show (Return l) Source # 

Methods

showsPrec :: Int -> Return l -> ShowS #

show :: Return l -> String #

showList :: [Return l] -> ShowS #

Generic (Return l) Source # 

Associated Types

type Rep (Return l) :: * -> * #

Methods

from :: Return l -> Rep (Return l) x #

to :: Rep (Return l) x -> Return l #

Show l => Pretty (Return l) Source # 

Methods

pretty :: Return l -> Doc Source #

prettyPrec :: Int -> Return l -> Doc Source #

type Rep (Return l) Source # 
type Rep (Return l) = D1 (MetaData "Return" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Return" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoReturn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "returnExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (ExpNode l))))))

data Synchronized l Source #

A synchronized statement acquires a mutual-exclusion lock on behalf of the executing thread, executes a block, then releases the lock. While the executing thread owns the lock, no other thread may acquire the lock.

Instances

HasNode Synchronized StmtNode Source # 
Eq l => Eq (Synchronized l) Source # 
Data l => Data (Synchronized l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Synchronized l -> c (Synchronized l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Synchronized l) #

toConstr :: Synchronized l -> Constr #

dataTypeOf :: Synchronized l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Synchronized l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Synchronized l)) #

gmapT :: (forall b. Data b => b -> b) -> Synchronized l -> Synchronized l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Synchronized l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Synchronized l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Synchronized l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Synchronized l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Synchronized l -> m (Synchronized l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Synchronized l -> m (Synchronized l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Synchronized l -> m (Synchronized l) #

Read l => Read (Synchronized l) Source # 
Show l => Show (Synchronized l) Source # 
Generic (Synchronized l) Source # 

Associated Types

type Rep (Synchronized l) :: * -> * #

Methods

from :: Synchronized l -> Rep (Synchronized l) x #

to :: Rep (Synchronized l) x -> Synchronized l #

Show l => Pretty (Synchronized l) Source # 
type Rep (Synchronized l) Source # 
type Rep (Synchronized l) = D1 (MetaData "Synchronized" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Synchronized" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoSynchronized") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "synchronizeOn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "synchronizeBloc") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block l))))))

data Throw l Source #

A throw statement causes an exception to be thrown.

Constructors

Throw 

Fields

Instances

HasNode Throw StmtNode Source # 

Methods

toNode :: Throw l -> StmtNode l Source #

Eq l => Eq (Throw l) Source # 

Methods

(==) :: Throw l -> Throw l -> Bool #

(/=) :: Throw l -> Throw l -> Bool #

Data l => Data (Throw l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Throw l -> c (Throw l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Throw l) #

toConstr :: Throw l -> Constr #

dataTypeOf :: Throw l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Throw l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Throw l)) #

gmapT :: (forall b. Data b => b -> b) -> Throw l -> Throw l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Throw l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Throw l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Throw l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Throw l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Throw l -> m (Throw l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Throw l -> m (Throw l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Throw l -> m (Throw l) #

Read l => Read (Throw l) Source # 
Show l => Show (Throw l) Source # 

Methods

showsPrec :: Int -> Throw l -> ShowS #

show :: Throw l -> String #

showList :: [Throw l] -> ShowS #

Generic (Throw l) Source # 

Associated Types

type Rep (Throw l) :: * -> * #

Methods

from :: Throw l -> Rep (Throw l) x #

to :: Rep (Throw l) x -> Throw l #

Show l => Pretty (Throw l) Source # 

Methods

pretty :: Throw l -> Doc Source #

prettyPrec :: Int -> Throw l -> Doc Source #

type Rep (Throw l) Source # 
type Rep (Throw l) = D1 (MetaData "Throw" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Throw" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoThrow") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "throwExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))))

data Try l Source #

A try statement executes a block. If a value is thrown and the try statement has one or more catch clauses that can catch it, then control will be transferred to the first such catch clause. If the try statement has a finally clause, then another block of code is executed, no matter whether the try block completes normally or abruptly, and no matter whether a catch clause is first given control.

Constructors

Try 

Fields

Instances

HasNode Try StmtNode Source # 

Methods

toNode :: Try l -> StmtNode l Source #

Eq l => Eq (Try l) Source # 

Methods

(==) :: Try l -> Try l -> Bool #

(/=) :: Try l -> Try l -> Bool #

Data l => Data (Try l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Try l -> c (Try l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Try l) #

toConstr :: Try l -> Constr #

dataTypeOf :: Try l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Try l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Try l)) #

gmapT :: (forall b. Data b => b -> b) -> Try l -> Try l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Try l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Try l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Try l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Try l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Try l -> m (Try l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Try l -> m (Try l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Try l -> m (Try l) #

Read l => Read (Try l) Source # 
Show l => Show (Try l) Source # 

Methods

showsPrec :: Int -> Try l -> ShowS #

show :: Try l -> String #

showList :: [Try l] -> ShowS #

Generic (Try l) Source # 

Associated Types

type Rep (Try l) :: * -> * #

Methods

from :: Try l -> Rep (Try l) x #

to :: Rep (Try l) x -> Try l #

Show l => Pretty (Try l) Source # 

Methods

pretty :: Try l -> Doc Source #

prettyPrec :: Int -> Try l -> Doc Source #

type Rep (Try l) Source # 

data Labeled l Source #

Statements may have label prefixes.

Constructors

Labeled 

Fields

Instances

HasNode Labeled StmtNode Source # 

Methods

toNode :: Labeled l -> StmtNode l Source #

Eq l => Eq (Labeled l) Source # 

Methods

(==) :: Labeled l -> Labeled l -> Bool #

(/=) :: Labeled l -> Labeled l -> Bool #

Data l => Data (Labeled l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Labeled l -> c (Labeled l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Labeled l) #

toConstr :: Labeled l -> Constr #

dataTypeOf :: Labeled l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Labeled l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Labeled l)) #

gmapT :: (forall b. Data b => b -> b) -> Labeled l -> Labeled l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Labeled l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Labeled l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Labeled l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Labeled l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Labeled l -> m (Labeled l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Labeled l -> m (Labeled l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Labeled l -> m (Labeled l) #

Read l => Read (Labeled l) Source # 
Show l => Show (Labeled l) Source # 

Methods

showsPrec :: Int -> Labeled l -> ShowS #

show :: Labeled l -> String #

showList :: [Labeled l] -> ShowS #

Generic (Labeled l) Source # 

Associated Types

type Rep (Labeled l) :: * -> * #

Methods

from :: Labeled l -> Rep (Labeled l) x #

to :: Rep (Labeled l) x -> Labeled l #

Show l => Pretty (Labeled l) Source # 
type Rep (Labeled l) Source # 
type Rep (Labeled l) = D1 (MetaData "Labeled" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Labeled" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoLabeled") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "label") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) (S1 (MetaSel (Just Symbol "labeledStmt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StmtNode l))))))

data Catch l Source #

If a value is thrown and the try statement has one or more catch clauses that can catch it, then control will be transferred to the first such catch clause.

Constructors

Catch 

Instances

Eq l => Eq (Catch l) Source # 

Methods

(==) :: Catch l -> Catch l -> Bool #

(/=) :: Catch l -> Catch l -> Bool #

Data l => Data (Catch l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Catch l -> c (Catch l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Catch l) #

toConstr :: Catch l -> Constr #

dataTypeOf :: Catch l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Catch l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Catch l)) #

gmapT :: (forall b. Data b => b -> b) -> Catch l -> Catch l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Catch l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Catch l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Catch l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Catch l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Catch l -> m (Catch l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Catch l -> m (Catch l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Catch l -> m (Catch l) #

Read l => Read (Catch l) Source # 
Show l => Show (Catch l) Source # 

Methods

showsPrec :: Int -> Catch l -> ShowS #

show :: Catch l -> String #

showList :: [Catch l] -> ShowS #

Generic (Catch l) Source # 

Associated Types

type Rep (Catch l) :: * -> * #

Methods

from :: Catch l -> Rep (Catch l) x #

to :: Rep (Catch l) x -> Catch l #

Show l => Pretty (Catch l) Source # 

Methods

pretty :: Catch l -> Doc Source #

prettyPrec :: Int -> Catch l -> Doc Source #

type Rep (Catch l) Source # 
type Rep (Catch l) = D1 (MetaData "Catch" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Catch" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoCatch") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "catchParam") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (FormalParam l))) (S1 (MetaSel (Just Symbol "catchBlock") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block l))))))

data TryResourceVar l Source #

Newly declared variables

Instances

HasNode TryResourceVar TryResourceNode Source # 
Eq l => Eq (TryResourceVar l) Source # 
Data l => Data (TryResourceVar l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TryResourceVar l -> c (TryResourceVar l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TryResourceVar l) #

toConstr :: TryResourceVar l -> Constr #

dataTypeOf :: TryResourceVar l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (TryResourceVar l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TryResourceVar l)) #

gmapT :: (forall b. Data b => b -> b) -> TryResourceVar l -> TryResourceVar l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TryResourceVar l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TryResourceVar l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TryResourceVar l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TryResourceVar l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TryResourceVar l -> m (TryResourceVar l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TryResourceVar l -> m (TryResourceVar l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TryResourceVar l -> m (TryResourceVar l) #

Read l => Read (TryResourceVar l) Source # 
Show l => Show (TryResourceVar l) Source # 
Generic (TryResourceVar l) Source # 

Associated Types

type Rep (TryResourceVar l) :: * -> * #

Show l => Pretty (TryResourceVar l) Source # 
type Rep (TryResourceVar l) Source # 
type Rep (TryResourceVar l) = D1 (MetaData "TryResourceVar" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "TryResourceVar" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoTryResourceVar") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "resourceModifiers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Modifier l]))) ((:*:) (S1 (MetaSel (Just Symbol "resourceVarType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RefType)) (S1 (MetaSel (Just Symbol "resourceVarDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [VarDecl l])))))

data TryResourceFinalVar l Source #

Effectively final variable

Instances

HasNode TryResourceFinalVar TryResourceNode Source # 
Eq l => Eq (TryResourceFinalVar l) Source # 
Data l => Data (TryResourceFinalVar l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TryResourceFinalVar l -> c (TryResourceFinalVar l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TryResourceFinalVar l) #

toConstr :: TryResourceFinalVar l -> Constr #

dataTypeOf :: TryResourceFinalVar l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (TryResourceFinalVar l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TryResourceFinalVar l)) #

gmapT :: (forall b. Data b => b -> b) -> TryResourceFinalVar l -> TryResourceFinalVar l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TryResourceFinalVar l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TryResourceFinalVar l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TryResourceFinalVar l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TryResourceFinalVar l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TryResourceFinalVar l -> m (TryResourceFinalVar l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TryResourceFinalVar l -> m (TryResourceFinalVar l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TryResourceFinalVar l -> m (TryResourceFinalVar l) #

Read l => Read (TryResourceFinalVar l) Source # 
Show l => Show (TryResourceFinalVar l) Source # 
Generic (TryResourceFinalVar l) Source # 

Associated Types

type Rep (TryResourceFinalVar l) :: * -> * #

Show l => Pretty (TryResourceFinalVar l) Source # 
type Rep (TryResourceFinalVar l) Source # 
type Rep (TryResourceFinalVar l) = D1 (MetaData "TryResourceFinalVar" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "TryResourceFinalVar" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoTryResourceFinalVar") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "resourceFinalVarName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident))))

data SwitchBlock l Source #

A block of code labelled with a case or default within a switch statement.

Instances

Eq l => Eq (SwitchBlock l) Source # 
Data l => Data (SwitchBlock l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SwitchBlock l -> c (SwitchBlock l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SwitchBlock l) #

toConstr :: SwitchBlock l -> Constr #

dataTypeOf :: SwitchBlock l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (SwitchBlock l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SwitchBlock l)) #

gmapT :: (forall b. Data b => b -> b) -> SwitchBlock l -> SwitchBlock l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SwitchBlock l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SwitchBlock l -> r #

gmapQ :: (forall d. Data d => d -> u) -> SwitchBlock l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SwitchBlock l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SwitchBlock l -> m (SwitchBlock l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SwitchBlock l -> m (SwitchBlock l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SwitchBlock l -> m (SwitchBlock l) #

Read l => Read (SwitchBlock l) Source # 
Show l => Show (SwitchBlock l) Source # 
Generic (SwitchBlock l) Source # 

Associated Types

type Rep (SwitchBlock l) :: * -> * #

Methods

from :: SwitchBlock l -> Rep (SwitchBlock l) x #

to :: Rep (SwitchBlock l) x -> SwitchBlock l #

Show l => Pretty (SwitchBlock l) Source # 
type Rep (SwitchBlock l) Source # 
type Rep (SwitchBlock l) = D1 (MetaData "SwitchBlock" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "SwitchBlock" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoSwitchBlock") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "switchLabel") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SwitchLabelNode l))) (S1 (MetaSel (Just Symbol "switchStmts") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [BlockStmtNode l])))))

data ForLocalVars l Source #

Initialization code for a basic for statement.

Instances

HasNode ForLocalVars ForInitNode Source # 
Eq l => Eq (ForLocalVars l) Source # 
Data l => Data (ForLocalVars l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForLocalVars l -> c (ForLocalVars l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ForLocalVars l) #

toConstr :: ForLocalVars l -> Constr #

dataTypeOf :: ForLocalVars l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ForLocalVars l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ForLocalVars l)) #

gmapT :: (forall b. Data b => b -> b) -> ForLocalVars l -> ForLocalVars l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForLocalVars l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForLocalVars l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForLocalVars l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForLocalVars l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForLocalVars l -> m (ForLocalVars l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForLocalVars l -> m (ForLocalVars l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForLocalVars l -> m (ForLocalVars l) #

Read l => Read (ForLocalVars l) Source # 
Show l => Show (ForLocalVars l) Source # 
Generic (ForLocalVars l) Source # 

Associated Types

type Rep (ForLocalVars l) :: * -> * #

Methods

from :: ForLocalVars l -> Rep (ForLocalVars l) x #

to :: Rep (ForLocalVars l) x -> ForLocalVars l #

Show l => Pretty (ForLocalVars l) Source # 
type Rep (ForLocalVars l) Source # 
type Rep (ForLocalVars l) = D1 (MetaData "ForLocalVars" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ForLocalVars" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoForLocalVars") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "forVarModifiers") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Modifier l]))) ((:*:) (S1 (MetaSel (Just Symbol "forVarType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type)) (S1 (MetaSel (Just Symbol "forVarDecls") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [VarDecl l])))))

data ForInitExps l Source #

Constructors

ForInitExps 

Fields

Instances

HasNode ForInitExps ForInitNode Source # 
Eq l => Eq (ForInitExps l) Source # 
Data l => Data (ForInitExps l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForInitExps l -> c (ForInitExps l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ForInitExps l) #

toConstr :: ForInitExps l -> Constr #

dataTypeOf :: ForInitExps l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ForInitExps l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ForInitExps l)) #

gmapT :: (forall b. Data b => b -> b) -> ForInitExps l -> ForInitExps l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForInitExps l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForInitExps l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForInitExps l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForInitExps l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForInitExps l -> m (ForInitExps l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForInitExps l -> m (ForInitExps l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForInitExps l -> m (ForInitExps l) #

Read l => Read (ForInitExps l) Source # 
Show l => Show (ForInitExps l) Source # 
Generic (ForInitExps l) Source # 

Associated Types

type Rep (ForInitExps l) :: * -> * #

Methods

from :: ForInitExps l -> Rep (ForInitExps l) x #

to :: Rep (ForInitExps l) x -> ForInitExps l #

Show l => Pretty (ForInitExps l) Source # 
type Rep (ForInitExps l) Source # 
type Rep (ForInitExps l) = D1 (MetaData "ForInitExps" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ForInitExps" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoForInitExps") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "initExpr") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ExpNode l]))))

data ExceptionType l Source #

An exception type has to be a class type or a type variable.

Instances

Eq l => Eq (ExceptionType l) Source # 
Data l => Data (ExceptionType l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExceptionType l -> c (ExceptionType l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ExceptionType l) #

toConstr :: ExceptionType l -> Constr #

dataTypeOf :: ExceptionType l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ExceptionType l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ExceptionType l)) #

gmapT :: (forall b. Data b => b -> b) -> ExceptionType l -> ExceptionType l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExceptionType l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExceptionType l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExceptionType l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExceptionType l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExceptionType l -> m (ExceptionType l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExceptionType l -> m (ExceptionType l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExceptionType l -> m (ExceptionType l) #

Read l => Read (ExceptionType l) Source # 
Show l => Show (ExceptionType l) Source # 
Generic (ExceptionType l) Source # 

Associated Types

type Rep (ExceptionType l) :: * -> * #

HasType (ExceptionType l) Source # 
Pretty (ExceptionType l) Source # 
type Rep (ExceptionType l) Source # 
type Rep (ExceptionType l) = D1 (MetaData "ExceptionType" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ExceptionType" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoExceptionType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "expectionType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RefType))))

data Lit l Source #

A literal denotes a fixed, unchanging value.

Constructors

Lit 

Fields

Instances

HasNode Lit ExpNode Source # 

Methods

toNode :: Lit l -> ExpNode l Source #

Eq l => Eq (Lit l) Source # 

Methods

(==) :: Lit l -> Lit l -> Bool #

(/=) :: Lit l -> Lit l -> Bool #

Data l => Data (Lit l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Lit l -> c (Lit l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Lit l) #

toConstr :: Lit l -> Constr #

dataTypeOf :: Lit l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Lit l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Lit l)) #

gmapT :: (forall b. Data b => b -> b) -> Lit l -> Lit l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Lit l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Lit l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Lit l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Lit l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Lit l -> m (Lit l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit l -> m (Lit l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit l -> m (Lit l) #

Read l => Read (Lit l) Source # 
Show l => Show (Lit l) Source # 

Methods

showsPrec :: Int -> Lit l -> ShowS #

show :: Lit l -> String #

showList :: [Lit l] -> ShowS #

Generic (Lit l) Source # 

Associated Types

type Rep (Lit l) :: * -> * #

Methods

from :: Lit l -> Rep (Lit l) x #

to :: Rep (Lit l) x -> Lit l #

Show l => Pretty (Lit l) Source # 

Methods

pretty :: Lit l -> Doc Source #

prettyPrec :: Int -> Lit l -> Doc Source #

type Rep (Lit l) Source # 
type Rep (Lit l) = D1 (MetaData "Lit" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Lit" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoLit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "literal") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Literal))))

data ClassLit l Source #

A class literal, which is an expression consisting of the name of a class, interface, array, or primitive type, or the pseudo-type void (modelled by Nothing), followed by a . and the token class.

Constructors

ClassLit 

Fields

Instances

HasNode ClassLit ExpNode Source # 

Methods

toNode :: ClassLit l -> ExpNode l Source #

Eq l => Eq (ClassLit l) Source # 

Methods

(==) :: ClassLit l -> ClassLit l -> Bool #

(/=) :: ClassLit l -> ClassLit l -> Bool #

Data l => Data (ClassLit l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassLit l -> c (ClassLit l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassLit l) #

toConstr :: ClassLit l -> Constr #

dataTypeOf :: ClassLit l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ClassLit l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassLit l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassLit l -> ClassLit l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassLit l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassLit l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassLit l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassLit l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassLit l -> m (ClassLit l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassLit l -> m (ClassLit l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassLit l -> m (ClassLit l) #

Read l => Read (ClassLit l) Source # 
Show l => Show (ClassLit l) Source # 

Methods

showsPrec :: Int -> ClassLit l -> ShowS #

show :: ClassLit l -> String #

showList :: [ClassLit l] -> ShowS #

Generic (ClassLit l) Source # 

Associated Types

type Rep (ClassLit l) :: * -> * #

Methods

from :: ClassLit l -> Rep (ClassLit l) x #

to :: Rep (ClassLit l) x -> ClassLit l #

Show l => Pretty (ClassLit l) Source # 
type Rep (ClassLit l) Source # 
type Rep (ClassLit l) = D1 (MetaData "ClassLit" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ClassLit" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoClassLit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "classLit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Type)))))

newtype This l Source #

The keyword this denotes a value that is a reference to the object for which the instance method was invoked, or to the object being constructed.

Constructors

This 

Fields

Instances

HasNode This ExpNode Source # 

Methods

toNode :: This l -> ExpNode l Source #

Eq l => Eq (This l) Source # 

Methods

(==) :: This l -> This l -> Bool #

(/=) :: This l -> This l -> Bool #

Data l => Data (This l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> This l -> c (This l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (This l) #

toConstr :: This l -> Constr #

dataTypeOf :: This l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (This l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (This l)) #

gmapT :: (forall b. Data b => b -> b) -> This l -> This l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> This l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> This l -> r #

gmapQ :: (forall d. Data d => d -> u) -> This l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> This l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> This l -> m (This l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> This l -> m (This l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> This l -> m (This l) #

Read l => Read (This l) Source # 
Show l => Show (This l) Source # 

Methods

showsPrec :: Int -> This l -> ShowS #

show :: This l -> String #

showList :: [This l] -> ShowS #

Generic (This l) Source # 

Associated Types

type Rep (This l) :: * -> * #

Methods

from :: This l -> Rep (This l) x #

to :: Rep (This l) x -> This l #

Show l => Pretty (This l) Source # 

Methods

pretty :: This l -> Doc Source #

prettyPrec :: Int -> This l -> Doc Source #

type Rep (This l) Source # 
type Rep (This l) = D1 (MetaData "This" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" True) (C1 (MetaCons "This" PrefixI True) (S1 (MetaSel (Just Symbol "infoThis") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)))

data QualifiedThis l Source #

Any lexically enclosing instance can be referred to by explicitly qualifying the keyword this. TODO: Fix Parser here

Constructors

QualifiedThis 

Instances

HasNode QualifiedThis ExpNode Source # 
Eq l => Eq (QualifiedThis l) Source # 
Data l => Data (QualifiedThis l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QualifiedThis l -> c (QualifiedThis l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (QualifiedThis l) #

toConstr :: QualifiedThis l -> Constr #

dataTypeOf :: QualifiedThis l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (QualifiedThis l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (QualifiedThis l)) #

gmapT :: (forall b. Data b => b -> b) -> QualifiedThis l -> QualifiedThis l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QualifiedThis l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QualifiedThis l -> r #

gmapQ :: (forall d. Data d => d -> u) -> QualifiedThis l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QualifiedThis l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QualifiedThis l -> m (QualifiedThis l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QualifiedThis l -> m (QualifiedThis l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QualifiedThis l -> m (QualifiedThis l) #

Read l => Read (QualifiedThis l) Source # 
Show l => Show (QualifiedThis l) Source # 
Generic (QualifiedThis l) Source # 

Associated Types

type Rep (QualifiedThis l) :: * -> * #

Show l => Pretty (QualifiedThis l) Source # 
type Rep (QualifiedThis l) Source # 
type Rep (QualifiedThis l) = D1 (MetaData "QualifiedThis" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "QualifiedThis" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoQualifiedThis") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "qualiType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type))))

data InstanceCreation l Source #

A class instance creation expression is used to create new objects that are instances of classes. | The first argument is a list of non-wildcard type arguments to a generic constructor. What follows is the type to be instantiated, the list of arguments passed to the constructor, and optionally a class body that makes the constructor result in an object of an anonymous class.

Instances

HasNode InstanceCreation ExpNode Source # 
Eq l => Eq (InstanceCreation l) Source # 
Data l => Data (InstanceCreation l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InstanceCreation l -> c (InstanceCreation l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InstanceCreation l) #

toConstr :: InstanceCreation l -> Constr #

dataTypeOf :: InstanceCreation l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (InstanceCreation l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InstanceCreation l)) #

gmapT :: (forall b. Data b => b -> b) -> InstanceCreation l -> InstanceCreation l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InstanceCreation l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InstanceCreation l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InstanceCreation l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InstanceCreation l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InstanceCreation l -> m (InstanceCreation l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InstanceCreation l -> m (InstanceCreation l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InstanceCreation l -> m (InstanceCreation l) #

Read l => Read (InstanceCreation l) Source # 
Show l => Show (InstanceCreation l) Source # 
Generic (InstanceCreation l) Source # 

Associated Types

type Rep (InstanceCreation l) :: * -> * #

Show l => Pretty (InstanceCreation l) Source # 
type Rep (InstanceCreation l) Source # 
type Rep (InstanceCreation l) = D1 (MetaData "InstanceCreation" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "InstanceCreation" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoInstanceCreation") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "instanceTypeArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [TypeArgument]))) ((:*:) (S1 (MetaSel (Just Symbol "instanceTypeDecl") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TypeDeclSpecifier)) ((:*:) (S1 (MetaSel (Just Symbol "instanceArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])) (S1 (MetaSel (Just Symbol "anonymousClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (ClassBody l))))))))

data QualInstanceCreation l Source #

A qualified class instance creation expression enables the creation of instances of inner member classes and their anonymous subclasses.

Instances

HasNode QualInstanceCreation ExpNode Source # 
Eq l => Eq (QualInstanceCreation l) Source # 
Data l => Data (QualInstanceCreation l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QualInstanceCreation l -> c (QualInstanceCreation l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (QualInstanceCreation l) #

toConstr :: QualInstanceCreation l -> Constr #

dataTypeOf :: QualInstanceCreation l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (QualInstanceCreation l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (QualInstanceCreation l)) #

gmapT :: (forall b. Data b => b -> b) -> QualInstanceCreation l -> QualInstanceCreation l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QualInstanceCreation l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QualInstanceCreation l -> r #

gmapQ :: (forall d. Data d => d -> u) -> QualInstanceCreation l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QualInstanceCreation l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QualInstanceCreation l -> m (QualInstanceCreation l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QualInstanceCreation l -> m (QualInstanceCreation l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QualInstanceCreation l -> m (QualInstanceCreation l) #

Read l => Read (QualInstanceCreation l) Source # 
Show l => Show (QualInstanceCreation l) Source # 
Generic (QualInstanceCreation l) Source # 
Show l => Pretty (QualInstanceCreation l) Source # 
type Rep (QualInstanceCreation l) Source # 
type Rep (QualInstanceCreation l) = D1 (MetaData "QualInstanceCreation" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "QualInstanceCreation" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoQualInstanceCreation") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "mysteryExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "qualiInstancetypeArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [TypeArgument])))) ((:*:) (S1 (MetaSel (Just Symbol "className") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) ((:*:) (S1 (MetaSel (Just Symbol "qualiInstanceArguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])) (S1 (MetaSel (Just Symbol "qualiInstanceAnonymousClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (ClassBody l))))))))

data ArrayCreate l Source #

An array instance creation expression is used to create new arrays. The last argument denotes the number of dimensions that have no explicit length given. These dimensions must be given last.

Constructors

ArrayCreate 

Instances

HasNode ArrayCreate ExpNode Source # 

Methods

toNode :: ArrayCreate l -> ExpNode l Source #

Eq l => Eq (ArrayCreate l) Source # 
Data l => Data (ArrayCreate l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArrayCreate l -> c (ArrayCreate l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ArrayCreate l) #

toConstr :: ArrayCreate l -> Constr #

dataTypeOf :: ArrayCreate l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ArrayCreate l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ArrayCreate l)) #

gmapT :: (forall b. Data b => b -> b) -> ArrayCreate l -> ArrayCreate l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArrayCreate l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArrayCreate l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ArrayCreate l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ArrayCreate l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArrayCreate l -> m (ArrayCreate l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayCreate l -> m (ArrayCreate l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayCreate l -> m (ArrayCreate l) #

Read l => Read (ArrayCreate l) Source # 
Show l => Show (ArrayCreate l) Source # 
Generic (ArrayCreate l) Source # 

Associated Types

type Rep (ArrayCreate l) :: * -> * #

Methods

from :: ArrayCreate l -> Rep (ArrayCreate l) x #

to :: Rep (ArrayCreate l) x -> ArrayCreate l #

Show l => Pretty (ArrayCreate l) Source # 
type Rep (ArrayCreate l) Source # 
type Rep (ArrayCreate l) = D1 (MetaData "ArrayCreate" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ArrayCreate" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoArrayCreate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "arrayType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type))) ((:*:) (S1 (MetaSel (Just Symbol "arrayDimExprs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ExpNode l])) (S1 (MetaSel (Just Symbol "dimensions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))))

data ArrayCreateInit l Source #

An array instance creation expression may come with an explicit initializer. Such expressions may not be given explicit lengths for any of its dimensions.

Instances

HasNode ArrayCreateInit ExpNode Source # 
Eq l => Eq (ArrayCreateInit l) Source # 
Data l => Data (ArrayCreateInit l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArrayCreateInit l -> c (ArrayCreateInit l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ArrayCreateInit l) #

toConstr :: ArrayCreateInit l -> Constr #

dataTypeOf :: ArrayCreateInit l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ArrayCreateInit l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ArrayCreateInit l)) #

gmapT :: (forall b. Data b => b -> b) -> ArrayCreateInit l -> ArrayCreateInit l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArrayCreateInit l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArrayCreateInit l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ArrayCreateInit l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ArrayCreateInit l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArrayCreateInit l -> m (ArrayCreateInit l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayCreateInit l -> m (ArrayCreateInit l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayCreateInit l -> m (ArrayCreateInit l) #

Read l => Read (ArrayCreateInit l) Source # 
Show l => Show (ArrayCreateInit l) Source # 
Generic (ArrayCreateInit l) Source # 

Associated Types

type Rep (ArrayCreateInit l) :: * -> * #

Show l => Pretty (ArrayCreateInit l) Source # 
type Rep (ArrayCreateInit l) Source # 
type Rep (ArrayCreateInit l) = D1 (MetaData "ArrayCreateInit" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ArrayCreateInit" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoArrayCreateInit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "arrayInitType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type))) ((:*:) (S1 (MetaSel (Just Symbol "arrayInitDimensions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) (S1 (MetaSel (Just Symbol "arrayCreatInit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayInit l))))))

data ExpName l Source #

An expression name, e.g. a variable.

Constructors

ExpName 

Fields

Instances

HasNode ExpName ExpNode Source # 

Methods

toNode :: ExpName l -> ExpNode l Source #

Eq l => Eq (ExpName l) Source # 

Methods

(==) :: ExpName l -> ExpName l -> Bool #

(/=) :: ExpName l -> ExpName l -> Bool #

Data l => Data (ExpName l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExpName l -> c (ExpName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ExpName l) #

toConstr :: ExpName l -> Constr #

dataTypeOf :: ExpName l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ExpName l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ExpName l)) #

gmapT :: (forall b. Data b => b -> b) -> ExpName l -> ExpName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExpName l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExpName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExpName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExpName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExpName l -> m (ExpName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExpName l -> m (ExpName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExpName l -> m (ExpName l) #

Read l => Read (ExpName l) Source # 
Show l => Show (ExpName l) Source # 

Methods

showsPrec :: Int -> ExpName l -> ShowS #

show :: ExpName l -> String #

showList :: [ExpName l] -> ShowS #

Generic (ExpName l) Source # 

Associated Types

type Rep (ExpName l) :: * -> * #

Methods

from :: ExpName l -> Rep (ExpName l) x #

to :: Rep (ExpName l) x -> ExpName l #

Show l => Pretty (ExpName l) Source # 
type Rep (ExpName l) Source # 
type Rep (ExpName l) = D1 (MetaData "ExpName" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ExpName" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoExpName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "expName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name))))

data Cast l Source #

A cast expression converts, at run time, a value of one numeric type to a similar value of another numeric type; or confirms, at compile time, that the type of an expression is boolean; or checks, at run time, that a reference value refers to an object whose class is compatible with a specified reference type.

Constructors

Cast 

Fields

Instances

HasNode Cast ExpNode Source # 

Methods

toNode :: Cast l -> ExpNode l Source #

Eq l => Eq (Cast l) Source # 

Methods

(==) :: Cast l -> Cast l -> Bool #

(/=) :: Cast l -> Cast l -> Bool #

Data l => Data (Cast l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Cast l -> c (Cast l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Cast l) #

toConstr :: Cast l -> Constr #

dataTypeOf :: Cast l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Cast l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Cast l)) #

gmapT :: (forall b. Data b => b -> b) -> Cast l -> Cast l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Cast l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Cast l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Cast l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Cast l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Cast l -> m (Cast l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Cast l -> m (Cast l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Cast l -> m (Cast l) #

Read l => Read (Cast l) Source # 
Show l => Show (Cast l) Source # 

Methods

showsPrec :: Int -> Cast l -> ShowS #

show :: Cast l -> String #

showList :: [Cast l] -> ShowS #

Generic (Cast l) Source # 

Associated Types

type Rep (Cast l) :: * -> * #

Methods

from :: Cast l -> Rep (Cast l) x #

to :: Rep (Cast l) x -> Cast l #

Show l => Pretty (Cast l) Source # 

Methods

pretty :: Cast l -> Doc Source #

prettyPrec :: Int -> Cast l -> Doc Source #

type Rep (Cast l) Source # 
type Rep (Cast l) = D1 (MetaData "Cast" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Cast" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoCast") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "castTarget") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Type)) (S1 (MetaSel (Just Symbol "castArg") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))))))

data BinOp l Source #

The application of a binary operator to two operand expressions.

Constructors

BinOp 

Fields

Instances

HasNode BinOp ExpNode Source # 

Methods

toNode :: BinOp l -> ExpNode l Source #

Eq l => Eq (BinOp l) Source # 

Methods

(==) :: BinOp l -> BinOp l -> Bool #

(/=) :: BinOp l -> BinOp l -> Bool #

Data l => Data (BinOp l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BinOp l -> c (BinOp l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BinOp l) #

toConstr :: BinOp l -> Constr #

dataTypeOf :: BinOp l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (BinOp l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BinOp l)) #

gmapT :: (forall b. Data b => b -> b) -> BinOp l -> BinOp l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BinOp l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BinOp l -> r #

gmapQ :: (forall d. Data d => d -> u) -> BinOp l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BinOp l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BinOp l -> m (BinOp l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BinOp l -> m (BinOp l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BinOp l -> m (BinOp l) #

Read l => Read (BinOp l) Source # 
Show l => Show (BinOp l) Source # 

Methods

showsPrec :: Int -> BinOp l -> ShowS #

show :: BinOp l -> String #

showList :: [BinOp l] -> ShowS #

Generic (BinOp l) Source # 

Associated Types

type Rep (BinOp l) :: * -> * #

Methods

from :: BinOp l -> Rep (BinOp l) x #

to :: Rep (BinOp l) x -> BinOp l #

Show l => Pretty (BinOp l) Source # 

Methods

pretty :: BinOp l -> Doc Source #

prettyPrec :: Int -> BinOp l -> Doc Source #

type Rep (BinOp l) Source # 

data InstanceOf l Source #

Testing whether the result of an expression is an instance of some reference type.

Instances

HasNode InstanceOf ExpNode Source # 

Methods

toNode :: InstanceOf l -> ExpNode l Source #

Eq l => Eq (InstanceOf l) Source # 

Methods

(==) :: InstanceOf l -> InstanceOf l -> Bool #

(/=) :: InstanceOf l -> InstanceOf l -> Bool #

Data l => Data (InstanceOf l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InstanceOf l -> c (InstanceOf l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InstanceOf l) #

toConstr :: InstanceOf l -> Constr #

dataTypeOf :: InstanceOf l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (InstanceOf l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InstanceOf l)) #

gmapT :: (forall b. Data b => b -> b) -> InstanceOf l -> InstanceOf l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InstanceOf l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InstanceOf l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InstanceOf l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InstanceOf l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InstanceOf l -> m (InstanceOf l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InstanceOf l -> m (InstanceOf l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InstanceOf l -> m (InstanceOf l) #

Read l => Read (InstanceOf l) Source # 
Show l => Show (InstanceOf l) Source # 
Generic (InstanceOf l) Source # 

Associated Types

type Rep (InstanceOf l) :: * -> * #

Methods

from :: InstanceOf l -> Rep (InstanceOf l) x #

to :: Rep (InstanceOf l) x -> InstanceOf l #

Show l => Pretty (InstanceOf l) Source # 
type Rep (InstanceOf l) Source # 
type Rep (InstanceOf l) = D1 (MetaData "InstanceOf" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "InstanceOf" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoInstanceOf") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "instanceOfArg") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "instanceOfTarget") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RefType)))))

data Cond l Source #

The conditional operator ? : uses the boolean value of one expression to decide which of two other expressions should be evaluated.

Constructors

Cond 

Instances

HasNode Cond ExpNode Source # 

Methods

toNode :: Cond l -> ExpNode l Source #

Eq l => Eq (Cond l) Source # 

Methods

(==) :: Cond l -> Cond l -> Bool #

(/=) :: Cond l -> Cond l -> Bool #

Data l => Data (Cond l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Cond l -> c (Cond l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Cond l) #

toConstr :: Cond l -> Constr #

dataTypeOf :: Cond l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Cond l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Cond l)) #

gmapT :: (forall b. Data b => b -> b) -> Cond l -> Cond l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Cond l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Cond l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Cond l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Cond l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Cond l -> m (Cond l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Cond l -> m (Cond l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Cond l -> m (Cond l) #

Read l => Read (Cond l) Source # 
Show l => Show (Cond l) Source # 

Methods

showsPrec :: Int -> Cond l -> ShowS #

show :: Cond l -> String #

showList :: [Cond l] -> ShowS #

Generic (Cond l) Source # 

Associated Types

type Rep (Cond l) :: * -> * #

Methods

from :: Cond l -> Rep (Cond l) x #

to :: Rep (Cond l) x -> Cond l #

Show l => Pretty (Cond l) Source # 

Methods

pretty :: Cond l -> Doc Source #

prettyPrec :: Int -> Cond l -> Doc Source #

type Rep (Cond l) Source # 
type Rep (Cond l) = D1 (MetaData "Cond" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Cond" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoCond") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "condition") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) ((:*:) (S1 (MetaSel (Just Symbol "conditionTrueExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "conditionFalseExp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))))))

data Assign l Source #

Assignment of the result of an expression to a variable.

Constructors

Assign 

Instances

HasNode Assign ExpNode Source # 

Methods

toNode :: Assign l -> ExpNode l Source #

Eq l => Eq (Assign l) Source # 

Methods

(==) :: Assign l -> Assign l -> Bool #

(/=) :: Assign l -> Assign l -> Bool #

Data l => Data (Assign l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Assign l -> c (Assign l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Assign l) #

toConstr :: Assign l -> Constr #

dataTypeOf :: Assign l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Assign l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Assign l)) #

gmapT :: (forall b. Data b => b -> b) -> Assign l -> Assign l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Assign l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Assign l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Assign l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Assign l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Assign l -> m (Assign l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Assign l -> m (Assign l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Assign l -> m (Assign l) #

Read l => Read (Assign l) Source # 
Show l => Show (Assign l) Source # 

Methods

showsPrec :: Int -> Assign l -> ShowS #

show :: Assign l -> String #

showList :: [Assign l] -> ShowS #

Generic (Assign l) Source # 

Associated Types

type Rep (Assign l) :: * -> * #

Methods

from :: Assign l -> Rep (Assign l) x #

to :: Rep (Assign l) x -> Assign l #

Show l => Pretty (Assign l) Source # 

Methods

pretty :: Assign l -> Doc Source #

prettyPrec :: Int -> Assign l -> Doc Source #

type Rep (Assign l) Source # 
type Rep (Assign l) = D1 (MetaData "Assign" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Assign" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoAssign") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "assignTarget") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LhsNode l)))) ((:*:) (S1 (MetaSel (Just Symbol "assignOp") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 AssignOp)) (S1 (MetaSel (Just Symbol "assignSource") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))))))

data Lambda l Source #

Lambda expression

Instances

HasNode Lambda ExpNode Source # 

Methods

toNode :: Lambda l -> ExpNode l Source #

Eq l => Eq (Lambda l) Source # 

Methods

(==) :: Lambda l -> Lambda l -> Bool #

(/=) :: Lambda l -> Lambda l -> Bool #

Data l => Data (Lambda l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Lambda l -> c (Lambda l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Lambda l) #

toConstr :: Lambda l -> Constr #

dataTypeOf :: Lambda l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (Lambda l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Lambda l)) #

gmapT :: (forall b. Data b => b -> b) -> Lambda l -> Lambda l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Lambda l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Lambda l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Lambda l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Lambda l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Lambda l -> m (Lambda l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Lambda l -> m (Lambda l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Lambda l -> m (Lambda l) #

Read l => Read (Lambda l) Source # 
Show l => Show (Lambda l) Source # 

Methods

showsPrec :: Int -> Lambda l -> ShowS #

show :: Lambda l -> String #

showList :: [Lambda l] -> ShowS #

Generic (Lambda l) Source # 

Associated Types

type Rep (Lambda l) :: * -> * #

Methods

from :: Lambda l -> Rep (Lambda l) x #

to :: Rep (Lambda l) x -> Lambda l #

Show l => Pretty (Lambda l) Source # 

Methods

pretty :: Lambda l -> Doc Source #

prettyPrec :: Int -> Lambda l -> Doc Source #

type Rep (Lambda l) Source # 
type Rep (Lambda l) = D1 (MetaData "Lambda" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "Lambda" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoLambda") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "lambdaParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LambdaParamsNode l))) (S1 (MetaSel (Just Symbol "lambdaExpression") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LambdaExpressionNode l))))))

data MethodRef l Source #

Method reference

Constructors

MethodRef 

Instances

HasNode MethodRef ExpNode Source # 

Methods

toNode :: MethodRef l -> ExpNode l Source #

Eq l => Eq (MethodRef l) Source # 

Methods

(==) :: MethodRef l -> MethodRef l -> Bool #

(/=) :: MethodRef l -> MethodRef l -> Bool #

Data l => Data (MethodRef l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MethodRef l -> c (MethodRef l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MethodRef l) #

toConstr :: MethodRef l -> Constr #

dataTypeOf :: MethodRef l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (MethodRef l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MethodRef l)) #

gmapT :: (forall b. Data b => b -> b) -> MethodRef l -> MethodRef l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MethodRef l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MethodRef l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MethodRef l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MethodRef l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MethodRef l -> m (MethodRef l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodRef l -> m (MethodRef l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodRef l -> m (MethodRef l) #

Read l => Read (MethodRef l) Source # 
Show l => Show (MethodRef l) Source # 
Generic (MethodRef l) Source # 

Associated Types

type Rep (MethodRef l) :: * -> * #

Methods

from :: MethodRef l -> Rep (MethodRef l) x #

to :: Rep (MethodRef l) x -> MethodRef l #

Show l => Pretty (MethodRef l) Source # 
type Rep (MethodRef l) Source # 
type Rep (MethodRef l) = D1 (MetaData "MethodRef" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "MethodRef" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoMethodRef") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "methodClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name)) (S1 (MetaSel (Just Symbol "methodName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)))))

data NameLhs l Source #

Assign to a variable

Constructors

NameLhs 

Fields

Instances

HasNode NameLhs LhsNode Source # 

Methods

toNode :: NameLhs l -> LhsNode l Source #

Eq l => Eq (NameLhs l) Source # 

Methods

(==) :: NameLhs l -> NameLhs l -> Bool #

(/=) :: NameLhs l -> NameLhs l -> Bool #

Data l => Data (NameLhs l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameLhs l -> c (NameLhs l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NameLhs l) #

toConstr :: NameLhs l -> Constr #

dataTypeOf :: NameLhs l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (NameLhs l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NameLhs l)) #

gmapT :: (forall b. Data b => b -> b) -> NameLhs l -> NameLhs l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameLhs l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameLhs l -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameLhs l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameLhs l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameLhs l -> m (NameLhs l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameLhs l -> m (NameLhs l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameLhs l -> m (NameLhs l) #

Read l => Read (NameLhs l) Source # 
Show l => Show (NameLhs l) Source # 

Methods

showsPrec :: Int -> NameLhs l -> ShowS #

show :: NameLhs l -> String #

showList :: [NameLhs l] -> ShowS #

Generic (NameLhs l) Source # 

Associated Types

type Rep (NameLhs l) :: * -> * #

Methods

from :: NameLhs l -> Rep (NameLhs l) x #

to :: Rep (NameLhs l) x -> NameLhs l #

Show l => Pretty (NameLhs l) Source # 
type Rep (NameLhs l) Source # 
type Rep (NameLhs l) = D1 (MetaData "NameLhs" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "NameLhs" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoNameLhs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "varLhsName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name))))

data ArrayIndex l Source #

Array access

Constructors

ArrayIndex 

Instances

HasNode ArrayIndex LhsNode Source # 

Methods

toNode :: ArrayIndex l -> LhsNode l Source #

HasNode ArrayIndex ExpNode Source # 

Methods

toNode :: ArrayIndex l -> ExpNode l Source #

Eq l => Eq (ArrayIndex l) Source # 

Methods

(==) :: ArrayIndex l -> ArrayIndex l -> Bool #

(/=) :: ArrayIndex l -> ArrayIndex l -> Bool #

Data l => Data (ArrayIndex l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArrayIndex l -> c (ArrayIndex l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ArrayIndex l) #

toConstr :: ArrayIndex l -> Constr #

dataTypeOf :: ArrayIndex l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ArrayIndex l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ArrayIndex l)) #

gmapT :: (forall b. Data b => b -> b) -> ArrayIndex l -> ArrayIndex l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArrayIndex l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArrayIndex l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ArrayIndex l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ArrayIndex l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArrayIndex l -> m (ArrayIndex l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayIndex l -> m (ArrayIndex l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayIndex l -> m (ArrayIndex l) #

Read l => Read (ArrayIndex l) Source # 
Show l => Show (ArrayIndex l) Source # 
Generic (ArrayIndex l) Source # 

Associated Types

type Rep (ArrayIndex l) :: * -> * #

Methods

from :: ArrayIndex l -> Rep (ArrayIndex l) x #

to :: Rep (ArrayIndex l) x -> ArrayIndex l #

Show l => Pretty (ArrayIndex l) Source # 
type Rep (ArrayIndex l) Source # 
type Rep (ArrayIndex l) = D1 (MetaData "ArrayIndex" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ArrayIndex" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoArrayIndex") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "arrayName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "arrayIndices") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [ExpNode l])))))

data PrimaryFieldAccess l Source #

Accessing a field of an object or array computed from an expression.

Instances

HasNode PrimaryFieldAccess FieldAccessNode Source # 
Eq l => Eq (PrimaryFieldAccess l) Source # 
Data l => Data (PrimaryFieldAccess l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrimaryFieldAccess l -> c (PrimaryFieldAccess l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PrimaryFieldAccess l) #

toConstr :: PrimaryFieldAccess l -> Constr #

dataTypeOf :: PrimaryFieldAccess l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (PrimaryFieldAccess l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PrimaryFieldAccess l)) #

gmapT :: (forall b. Data b => b -> b) -> PrimaryFieldAccess l -> PrimaryFieldAccess l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrimaryFieldAccess l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrimaryFieldAccess l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrimaryFieldAccess l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrimaryFieldAccess l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrimaryFieldAccess l -> m (PrimaryFieldAccess l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimaryFieldAccess l -> m (PrimaryFieldAccess l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimaryFieldAccess l -> m (PrimaryFieldAccess l) #

Read l => Read (PrimaryFieldAccess l) Source # 
Show l => Show (PrimaryFieldAccess l) Source # 
Generic (PrimaryFieldAccess l) Source # 

Associated Types

type Rep (PrimaryFieldAccess l) :: * -> * #

Show l => Pretty (PrimaryFieldAccess l) Source # 
type Rep (PrimaryFieldAccess l) Source # 
type Rep (PrimaryFieldAccess l) = D1 (MetaData "PrimaryFieldAccess" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "PrimaryFieldAccess" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoPrimaryFieldAccess") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "targetObject") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l))) (S1 (MetaSel (Just Symbol "targetField") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)))))

data SuperFieldAccess l Source #

Accessing a field of the superclass.

Instances

HasNode SuperFieldAccess FieldAccessNode Source # 
Eq l => Eq (SuperFieldAccess l) Source # 
Data l => Data (SuperFieldAccess l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SuperFieldAccess l -> c (SuperFieldAccess l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SuperFieldAccess l) #

toConstr :: SuperFieldAccess l -> Constr #

dataTypeOf :: SuperFieldAccess l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (SuperFieldAccess l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SuperFieldAccess l)) #

gmapT :: (forall b. Data b => b -> b) -> SuperFieldAccess l -> SuperFieldAccess l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SuperFieldAccess l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SuperFieldAccess l -> r #

gmapQ :: (forall d. Data d => d -> u) -> SuperFieldAccess l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SuperFieldAccess l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SuperFieldAccess l -> m (SuperFieldAccess l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SuperFieldAccess l -> m (SuperFieldAccess l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SuperFieldAccess l -> m (SuperFieldAccess l) #

Read l => Read (SuperFieldAccess l) Source # 
Show l => Show (SuperFieldAccess l) Source # 
Generic (SuperFieldAccess l) Source # 

Associated Types

type Rep (SuperFieldAccess l) :: * -> * #

Show l => Pretty (SuperFieldAccess l) Source # 
type Rep (SuperFieldAccess l) Source # 
type Rep (SuperFieldAccess l) = D1 (MetaData "SuperFieldAccess" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "SuperFieldAccess" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoSuperFieldAccess") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "superField") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident))))

data ClassFieldAccess l Source #

Accessing a (static) field of a named class.

Instances

HasNode ClassFieldAccess FieldAccessNode Source # 
Eq l => Eq (ClassFieldAccess l) Source # 
Data l => Data (ClassFieldAccess l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassFieldAccess l -> c (ClassFieldAccess l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassFieldAccess l) #

toConstr :: ClassFieldAccess l -> Constr #

dataTypeOf :: ClassFieldAccess l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ClassFieldAccess l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassFieldAccess l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassFieldAccess l -> ClassFieldAccess l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassFieldAccess l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassFieldAccess l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassFieldAccess l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassFieldAccess l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassFieldAccess l -> m (ClassFieldAccess l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassFieldAccess l -> m (ClassFieldAccess l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassFieldAccess l -> m (ClassFieldAccess l) #

Read l => Read (ClassFieldAccess l) Source # 
Show l => Show (ClassFieldAccess l) Source # 
Generic (ClassFieldAccess l) Source # 

Associated Types

type Rep (ClassFieldAccess l) :: * -> * #

Show l => Pretty (ClassFieldAccess l) Source # 
type Rep (ClassFieldAccess l) Source # 
type Rep (ClassFieldAccess l) = D1 (MetaData "ClassFieldAccess" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ClassFieldAccess" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoClassFieldAccess") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "targetClass") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name)) (S1 (MetaSel (Just Symbol "staticField") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)))))

data LambdaSingleParam l Source #

Instances

HasNode LambdaSingleParam LambdaParamsNode Source # 
Eq l => Eq (LambdaSingleParam l) Source # 
Data l => Data (LambdaSingleParam l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LambdaSingleParam l -> c (LambdaSingleParam l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LambdaSingleParam l) #

toConstr :: LambdaSingleParam l -> Constr #

dataTypeOf :: LambdaSingleParam l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LambdaSingleParam l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LambdaSingleParam l)) #

gmapT :: (forall b. Data b => b -> b) -> LambdaSingleParam l -> LambdaSingleParam l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LambdaSingleParam l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LambdaSingleParam l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LambdaSingleParam l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LambdaSingleParam l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LambdaSingleParam l -> m (LambdaSingleParam l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaSingleParam l -> m (LambdaSingleParam l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaSingleParam l -> m (LambdaSingleParam l) #

Read l => Read (LambdaSingleParam l) Source # 
Show l => Show (LambdaSingleParam l) Source # 
Generic (LambdaSingleParam l) Source # 

Associated Types

type Rep (LambdaSingleParam l) :: * -> * #

Show l => Pretty (LambdaSingleParam l) Source # 
type Rep (LambdaSingleParam l) Source # 
type Rep (LambdaSingleParam l) = D1 (MetaData "LambdaSingleParam" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "LambdaSingleParam" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoLambdaSingleParam") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "lambdaParamName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident))))

data LambdaFormalParams l Source #

Instances

HasNode LambdaFormalParams LambdaParamsNode Source # 
Eq l => Eq (LambdaFormalParams l) Source # 
Data l => Data (LambdaFormalParams l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LambdaFormalParams l -> c (LambdaFormalParams l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LambdaFormalParams l) #

toConstr :: LambdaFormalParams l -> Constr #

dataTypeOf :: LambdaFormalParams l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LambdaFormalParams l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LambdaFormalParams l)) #

gmapT :: (forall b. Data b => b -> b) -> LambdaFormalParams l -> LambdaFormalParams l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LambdaFormalParams l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LambdaFormalParams l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LambdaFormalParams l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LambdaFormalParams l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LambdaFormalParams l -> m (LambdaFormalParams l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaFormalParams l -> m (LambdaFormalParams l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaFormalParams l -> m (LambdaFormalParams l) #

Read l => Read (LambdaFormalParams l) Source # 
Show l => Show (LambdaFormalParams l) Source # 
Generic (LambdaFormalParams l) Source # 

Associated Types

type Rep (LambdaFormalParams l) :: * -> * #

Show l => Pretty (LambdaFormalParams l) Source # 
type Rep (LambdaFormalParams l) Source # 
type Rep (LambdaFormalParams l) = D1 (MetaData "LambdaFormalParams" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "LambdaFormalParams" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoLambdaFormalParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "lambdaFormalParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [FormalParam l]))))

data LambdaInferredParams l Source #

Instances

HasNode LambdaInferredParams LambdaParamsNode Source # 
Eq l => Eq (LambdaInferredParams l) Source # 
Data l => Data (LambdaInferredParams l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LambdaInferredParams l -> c (LambdaInferredParams l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LambdaInferredParams l) #

toConstr :: LambdaInferredParams l -> Constr #

dataTypeOf :: LambdaInferredParams l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (LambdaInferredParams l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LambdaInferredParams l)) #

gmapT :: (forall b. Data b => b -> b) -> LambdaInferredParams l -> LambdaInferredParams l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LambdaInferredParams l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LambdaInferredParams l -> r #

gmapQ :: (forall d. Data d => d -> u) -> LambdaInferredParams l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LambdaInferredParams l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LambdaInferredParams l -> m (LambdaInferredParams l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaInferredParams l -> m (LambdaInferredParams l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LambdaInferredParams l -> m (LambdaInferredParams l) #

Read l => Read (LambdaInferredParams l) Source # 
Show l => Show (LambdaInferredParams l) Source # 
Generic (LambdaInferredParams l) Source # 
Show l => Pretty (LambdaInferredParams l) Source # 
type Rep (LambdaInferredParams l) Source # 
type Rep (LambdaInferredParams l) = D1 (MetaData "LambdaInferredParams" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "LambdaInferredParams" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoLambdaInferredParams") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "lambdaParamNames") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Ident]))))

data MethodCall l Source #

Invoking a specific named method.

Constructors

MethodCall 

Instances

HasNode MethodCall MethodInvocationNode Source # 
Eq l => Eq (MethodCall l) Source # 

Methods

(==) :: MethodCall l -> MethodCall l -> Bool #

(/=) :: MethodCall l -> MethodCall l -> Bool #

Data l => Data (MethodCall l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MethodCall l -> c (MethodCall l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MethodCall l) #

toConstr :: MethodCall l -> Constr #

dataTypeOf :: MethodCall l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (MethodCall l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MethodCall l)) #

gmapT :: (forall b. Data b => b -> b) -> MethodCall l -> MethodCall l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MethodCall l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MethodCall l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MethodCall l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MethodCall l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MethodCall l -> m (MethodCall l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodCall l -> m (MethodCall l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MethodCall l -> m (MethodCall l) #

Read l => Read (MethodCall l) Source # 
Show l => Show (MethodCall l) Source # 
Generic (MethodCall l) Source # 

Associated Types

type Rep (MethodCall l) :: * -> * #

Methods

from :: MethodCall l -> Rep (MethodCall l) x #

to :: Rep (MethodCall l) x -> MethodCall l #

Show l => Pretty (MethodCall l) Source # 
type Rep (MethodCall l) Source # 
type Rep (MethodCall l) = D1 (MetaData "MethodCall" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "MethodCall" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoMethodCall") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) ((:*:) (S1 (MetaSel (Just Symbol "methodCallName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name)) (S1 (MetaSel (Just Symbol "methodCallArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])))))

data PrimaryMethodCall l Source #

Invoking a method of a class computed from a primary expression, giving arguments for any generic type parameters.

Instances

HasNode PrimaryMethodCall MethodInvocationNode Source # 
Eq l => Eq (PrimaryMethodCall l) Source # 
Data l => Data (PrimaryMethodCall l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrimaryMethodCall l -> c (PrimaryMethodCall l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PrimaryMethodCall l) #

toConstr :: PrimaryMethodCall l -> Constr #

dataTypeOf :: PrimaryMethodCall l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (PrimaryMethodCall l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PrimaryMethodCall l)) #

gmapT :: (forall b. Data b => b -> b) -> PrimaryMethodCall l -> PrimaryMethodCall l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrimaryMethodCall l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrimaryMethodCall l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrimaryMethodCall l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrimaryMethodCall l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrimaryMethodCall l -> m (PrimaryMethodCall l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimaryMethodCall l -> m (PrimaryMethodCall l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrimaryMethodCall l -> m (PrimaryMethodCall l) #

Read l => Read (PrimaryMethodCall l) Source # 
Show l => Show (PrimaryMethodCall l) Source # 
Generic (PrimaryMethodCall l) Source # 

Associated Types

type Rep (PrimaryMethodCall l) :: * -> * #

Show l => Pretty (PrimaryMethodCall l) Source # 
type Rep (PrimaryMethodCall l) Source # 
type Rep (PrimaryMethodCall l) = D1 (MetaData "PrimaryMethodCall" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "PrimaryMethodCall" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoPrimaryMethodCall") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "methodCallTargetObj") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpNode l)))) ((:*:) (S1 (MetaSel (Just Symbol "mysteryRefTypes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType])) ((:*:) (S1 (MetaSel (Just Symbol "primaryMethodName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) (S1 (MetaSel (Just Symbol "primaryMethodCallArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l]))))))

data SuperMethodCall l Source #

Invoking a method of the super class, giving arguments for any generic type parameters.

Instances

HasNode SuperMethodCall MethodInvocationNode Source # 
Eq l => Eq (SuperMethodCall l) Source # 
Data l => Data (SuperMethodCall l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SuperMethodCall l -> c (SuperMethodCall l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SuperMethodCall l) #

toConstr :: SuperMethodCall l -> Constr #

dataTypeOf :: SuperMethodCall l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (SuperMethodCall l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SuperMethodCall l)) #

gmapT :: (forall b. Data b => b -> b) -> SuperMethodCall l -> SuperMethodCall l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SuperMethodCall l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SuperMethodCall l -> r #

gmapQ :: (forall d. Data d => d -> u) -> SuperMethodCall l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SuperMethodCall l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SuperMethodCall l -> m (SuperMethodCall l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SuperMethodCall l -> m (SuperMethodCall l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SuperMethodCall l -> m (SuperMethodCall l) #

Read l => Read (SuperMethodCall l) Source # 
Show l => Show (SuperMethodCall l) Source # 
Generic (SuperMethodCall l) Source # 

Associated Types

type Rep (SuperMethodCall l) :: * -> * #

Show l => Pretty (SuperMethodCall l) Source # 
type Rep (SuperMethodCall l) Source # 
type Rep (SuperMethodCall l) = D1 (MetaData "SuperMethodCall" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "SuperMethodCall" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoSuperMethodCall") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "superMethodTypeArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType]))) ((:*:) (S1 (MetaSel (Just Symbol "superMethodName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) (S1 (MetaSel (Just Symbol "superMethodArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l])))))

data ClassMethodCall l Source #

Invoking a method of the superclass of a named class, giving arguments for any generic type parameters.

Instances

HasNode ClassMethodCall MethodInvocationNode Source # 
Eq l => Eq (ClassMethodCall l) Source # 
Data l => Data (ClassMethodCall l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassMethodCall l -> c (ClassMethodCall l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassMethodCall l) #

toConstr :: ClassMethodCall l -> Constr #

dataTypeOf :: ClassMethodCall l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ClassMethodCall l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassMethodCall l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassMethodCall l -> ClassMethodCall l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassMethodCall l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassMethodCall l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassMethodCall l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassMethodCall l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassMethodCall l -> m (ClassMethodCall l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassMethodCall l -> m (ClassMethodCall l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassMethodCall l -> m (ClassMethodCall l) #

Read l => Read (ClassMethodCall l) Source # 
Show l => Show (ClassMethodCall l) Source # 
Generic (ClassMethodCall l) Source # 

Associated Types

type Rep (ClassMethodCall l) :: * -> * #

Show l => Pretty (ClassMethodCall l) Source # 
type Rep (ClassMethodCall l) Source # 
type Rep (ClassMethodCall l) = D1 (MetaData "ClassMethodCall" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ClassMethodCall" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoClassMethodCall") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "methodClassTarget") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name))) ((:*:) (S1 (MetaSel (Just Symbol "classMethodTypeArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType])) ((:*:) (S1 (MetaSel (Just Symbol "classMethodName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) (S1 (MetaSel (Just Symbol "classMethodArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l]))))))

data TypeMethodCall l Source #

Invoking a method of a named type, giving arguments for any generic type parameters.

Instances

HasNode TypeMethodCall MethodInvocationNode Source # 
Eq l => Eq (TypeMethodCall l) Source # 
Data l => Data (TypeMethodCall l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeMethodCall l -> c (TypeMethodCall l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TypeMethodCall l) #

toConstr :: TypeMethodCall l -> Constr #

dataTypeOf :: TypeMethodCall l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (TypeMethodCall l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TypeMethodCall l)) #

gmapT :: (forall b. Data b => b -> b) -> TypeMethodCall l -> TypeMethodCall l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeMethodCall l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeMethodCall l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeMethodCall l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeMethodCall l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeMethodCall l -> m (TypeMethodCall l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeMethodCall l -> m (TypeMethodCall l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeMethodCall l -> m (TypeMethodCall l) #

Read l => Read (TypeMethodCall l) Source # 
Show l => Show (TypeMethodCall l) Source # 
Generic (TypeMethodCall l) Source # 

Associated Types

type Rep (TypeMethodCall l) :: * -> * #

Show l => Pretty (TypeMethodCall l) Source # 
type Rep (TypeMethodCall l) Source # 
type Rep (TypeMethodCall l) = D1 (MetaData "TypeMethodCall" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "TypeMethodCall" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "infoTypeMethodCall") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "typeMethodClassTarget") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Name))) ((:*:) (S1 (MetaSel (Just Symbol "typeMethodTypeArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [RefType])) ((:*:) (S1 (MetaSel (Just Symbol "typeMethodName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Ident)) (S1 (MetaSel (Just Symbol "typeMethodArgs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Argument l]))))))

data ArrayInit l Source #

An array initializer may be specified in a declaration, or as part of an array creation expression, creating an array and providing some initial values

Constructors

ArrayInit 

Fields

Instances

HasNode ArrayInit VarInitNode Source # 
Eq l => Eq (ArrayInit l) Source # 

Methods

(==) :: ArrayInit l -> ArrayInit l -> Bool #

(/=) :: ArrayInit l -> ArrayInit l -> Bool #

Data l => Data (ArrayInit l) Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArrayInit l -> c (ArrayInit l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ArrayInit l) #

toConstr :: ArrayInit l -> Constr #

dataTypeOf :: ArrayInit l -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c (ArrayInit l)) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ArrayInit l)) #

gmapT :: (forall b. Data b => b -> b) -> ArrayInit l -> ArrayInit l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArrayInit l -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArrayInit l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ArrayInit l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ArrayInit l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArrayInit l -> m (ArrayInit l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayInit l -> m (ArrayInit l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayInit l -> m (ArrayInit l) #

Read l => Read (ArrayInit l) Source # 
Show l => Show (ArrayInit l) Source # 
Generic (ArrayInit l) Source # 

Associated Types

type Rep (ArrayInit l) :: * -> * #

Methods

from :: ArrayInit l -> Rep (ArrayInit l) x #

to :: Rep (ArrayInit l) x -> ArrayInit l #

Show l => Pretty (ArrayInit l) Source # 
type Rep (ArrayInit l) Source # 
type Rep (ArrayInit l) = D1 (MetaData "ArrayInit" "Language.Java.Syntax" "language-java-0.2.8-AgEtH1QMF83H54ihDWLUQH" False) (C1 (MetaCons "ArrayInit" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "infoArrayInit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 l)) (S1 (MetaSel (Just Symbol "arrayInits") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [VarInitNode l]))))

type Argument = ExpNode Source #

Arguments to methods and constructors are expressions.