language-java-0.2.9: Java source manipulation
Safe HaskellSafe-Inferred
LanguageHaskell98

Language.Java.Syntax

Synopsis

Documentation

data CompilationUnit Source #

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

Instances

Instances details
Eq CompilationUnit Source # 
Instance details

Defined in Language.Java.Syntax

Data CompilationUnit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: CompilationUnit -> Constr

dataTypeOf :: CompilationUnit -> DataType

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

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

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

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

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

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

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

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

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

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

Read CompilationUnit Source # 
Instance details

Defined in Language.Java.Syntax

Show CompilationUnit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> CompilationUnit -> ShowS

show :: CompilationUnit -> String

showList :: [CompilationUnit] -> ShowS

Generic CompilationUnit Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep CompilationUnit :: Type -> Type

Pretty CompilationUnit Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: CompilationUnit -> Doc Source #

prettyPrec :: Int -> CompilationUnit -> Doc Source #

type Rep CompilationUnit Source # 
Instance details

Defined in Language.Java.Syntax

type Rep CompilationUnit = D1 ('MetaData "CompilationUnit" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "CompilationUnit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe PackageDecl)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ImportDecl]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeDecl]))))

newtype PackageDecl Source #

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

Constructors

PackageDecl Name 

Instances

Instances details
Eq PackageDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: PackageDecl -> PackageDecl -> Bool

(/=) :: PackageDecl -> PackageDecl -> Bool

Data PackageDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: PackageDecl -> Constr

dataTypeOf :: PackageDecl -> DataType

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

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

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

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

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

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

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

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

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

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

Read PackageDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS PackageDecl

readList :: ReadS [PackageDecl]

readPrec :: ReadPrec PackageDecl

readListPrec :: ReadPrec [PackageDecl]

Show PackageDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> PackageDecl -> ShowS

show :: PackageDecl -> String

showList :: [PackageDecl] -> ShowS

Generic PackageDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep PackageDecl :: Type -> Type

Methods

from :: PackageDecl -> Rep PackageDecl x

to :: Rep PackageDecl x -> PackageDecl

Pretty PackageDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: PackageDecl -> Doc Source #

prettyPrec :: Int -> PackageDecl -> Doc Source #

type Rep PackageDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep PackageDecl = D1 ('MetaData "PackageDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'True) (C1 ('MetaCons "PackageDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)))

data ImportDecl 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.

Constructors

ImportDecl Bool Name Bool 

Instances

Instances details
Eq ImportDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

Data ImportDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ImportDecl -> Constr

dataTypeOf :: ImportDecl -> DataType

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

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

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

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

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

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

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

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

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

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

Read ImportDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ImportDecl

readList :: ReadS [ImportDecl]

readPrec :: ReadPrec ImportDecl

readListPrec :: ReadPrec [ImportDecl]

Show ImportDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ImportDecl -> ShowS

show :: ImportDecl -> String

showList :: [ImportDecl] -> ShowS

Generic ImportDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ImportDecl :: Type -> Type

Methods

from :: ImportDecl -> Rep ImportDecl x

to :: Rep ImportDecl x -> ImportDecl

Pretty ImportDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ImportDecl -> Doc Source #

prettyPrec :: Int -> ImportDecl -> Doc Source #

type Rep ImportDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ImportDecl = D1 ('MetaData "ImportDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ImportDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

data TypeDecl Source #

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

Instances

Instances details
Eq TypeDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: TypeDecl -> TypeDecl -> Bool

(/=) :: TypeDecl -> TypeDecl -> Bool

Data TypeDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: TypeDecl -> Constr

dataTypeOf :: TypeDecl -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeDecl)

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

gmapT :: (forall b. Data b => b -> b) -> TypeDecl -> TypeDecl

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

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

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

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

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

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

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

Read TypeDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS TypeDecl

readList :: ReadS [TypeDecl]

readPrec :: ReadPrec TypeDecl

readListPrec :: ReadPrec [TypeDecl]

Show TypeDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> TypeDecl -> ShowS

show :: TypeDecl -> String

showList :: [TypeDecl] -> ShowS

Generic TypeDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep TypeDecl :: Type -> Type

Methods

from :: TypeDecl -> Rep TypeDecl x

to :: Rep TypeDecl x -> TypeDecl

Pretty TypeDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: TypeDecl -> Doc Source #

prettyPrec :: Int -> TypeDecl -> Doc Source #

type Rep TypeDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep TypeDecl = D1 ('MetaData "TypeDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ClassTypeDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassDecl)) :+: C1 ('MetaCons "InterfaceTypeDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InterfaceDecl)))

data ClassDecl Source #

A class declaration specifies a new named reference type.

Instances

Instances details
Eq ClassDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

Data ClassDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ClassDecl -> Constr

dataTypeOf :: ClassDecl -> DataType

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

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

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

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

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

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

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

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

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

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

Read ClassDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ClassDecl

readList :: ReadS [ClassDecl]

readPrec :: ReadPrec ClassDecl

readListPrec :: ReadPrec [ClassDecl]

Show ClassDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ClassDecl -> ShowS

show :: ClassDecl -> String

showList :: [ClassDecl] -> ShowS

Generic ClassDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ClassDecl :: Type -> Type

Methods

from :: ClassDecl -> Rep ClassDecl x

to :: Rep ClassDecl x -> ClassDecl

Pretty ClassDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ClassDecl -> Doc Source #

prettyPrec :: Int -> ClassDecl -> Doc Source #

type Rep ClassDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ClassDecl = D1 ('MetaData "ClassDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ClassDecl" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeParam]))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RefType)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassBody)))) :+: C1 ('MetaCons "EnumDecl" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 EnumBody))))

newtype ClassBody 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 [Decl] 

Instances

Instances details
Eq ClassBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

Data ClassBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ClassBody -> Constr

dataTypeOf :: ClassBody -> DataType

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

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

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

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

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

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

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

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

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

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

Read ClassBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ClassBody

readList :: ReadS [ClassBody]

readPrec :: ReadPrec ClassBody

readListPrec :: ReadPrec [ClassBody]

Show ClassBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ClassBody -> ShowS

show :: ClassBody -> String

showList :: [ClassBody] -> ShowS

Generic ClassBody Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ClassBody :: Type -> Type

Methods

from :: ClassBody -> Rep ClassBody x

to :: Rep ClassBody x -> ClassBody

Pretty ClassBody Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ClassBody -> Doc Source #

prettyPrec :: Int -> ClassBody -> Doc Source #

type Rep ClassBody Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ClassBody = D1 ('MetaData "ClassBody" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'True) (C1 ('MetaCons "ClassBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Decl])))

data EnumBody Source #

The body of an enum type may contain enum constants.

Constructors

EnumBody [EnumConstant] [Decl] 

Instances

Instances details
Eq EnumBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

Data EnumBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: EnumBody -> Constr

dataTypeOf :: EnumBody -> DataType

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

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

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

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

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

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

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

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

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

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

Read EnumBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS EnumBody

readList :: ReadS [EnumBody]

readPrec :: ReadPrec EnumBody

readListPrec :: ReadPrec [EnumBody]

Show EnumBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> EnumBody -> ShowS

show :: EnumBody -> String

showList :: [EnumBody] -> ShowS

Generic EnumBody Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep EnumBody :: Type -> Type

Methods

from :: EnumBody -> Rep EnumBody x

to :: Rep EnumBody x -> EnumBody

Pretty EnumBody Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: EnumBody -> Doc Source #

prettyPrec :: Int -> EnumBody -> Doc Source #

type Rep EnumBody Source # 
Instance details

Defined in Language.Java.Syntax

type Rep EnumBody = D1 ('MetaData "EnumBody" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "EnumBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [EnumConstant]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Decl])))

data EnumConstant Source #

An enum constant defines an instance of the enum type.

Constructors

EnumConstant Ident [Argument] (Maybe ClassBody) 

Instances

Instances details
Eq EnumConstant Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: EnumConstant -> EnumConstant -> Bool

(/=) :: EnumConstant -> EnumConstant -> Bool

Data EnumConstant Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: EnumConstant -> Constr

dataTypeOf :: EnumConstant -> DataType

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

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

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

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

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

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

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

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

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

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

Read EnumConstant Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS EnumConstant

readList :: ReadS [EnumConstant]

readPrec :: ReadPrec EnumConstant

readListPrec :: ReadPrec [EnumConstant]

Show EnumConstant Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> EnumConstant -> ShowS

show :: EnumConstant -> String

showList :: [EnumConstant] -> ShowS

Generic EnumConstant Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep EnumConstant :: Type -> Type

Pretty EnumConstant Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: EnumConstant -> Doc Source #

prettyPrec :: Int -> EnumConstant -> Doc Source #

type Rep EnumConstant Source # 
Instance details

Defined in Language.Java.Syntax

type Rep EnumConstant = D1 ('MetaData "EnumConstant" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "EnumConstant" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ClassBody)))))

data InterfaceDecl 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

Instances details
Eq InterfaceDecl Source # 
Instance details

Defined in Language.Java.Syntax

Data InterfaceDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: InterfaceDecl -> Constr

dataTypeOf :: InterfaceDecl -> DataType

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

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

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

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

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

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

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

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

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

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

Read InterfaceDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS InterfaceDecl

readList :: ReadS [InterfaceDecl]

readPrec :: ReadPrec InterfaceDecl

readListPrec :: ReadPrec [InterfaceDecl]

Show InterfaceDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> InterfaceDecl -> ShowS

show :: InterfaceDecl -> String

showList :: [InterfaceDecl] -> ShowS

Generic InterfaceDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep InterfaceDecl :: Type -> Type

Pretty InterfaceDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: InterfaceDecl -> Doc Source #

prettyPrec :: Int -> InterfaceDecl -> Doc Source #

type Rep InterfaceDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep InterfaceDecl = D1 ('MetaData "InterfaceDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "InterfaceDecl" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InterfaceKind) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeParam]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InterfaceBody)))))

newtype InterfaceBody Source #

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

Constructors

InterfaceBody [MemberDecl] 

Instances

Instances details
Eq InterfaceBody Source # 
Instance details

Defined in Language.Java.Syntax

Data InterfaceBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: InterfaceBody -> Constr

dataTypeOf :: InterfaceBody -> DataType

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

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

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

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

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

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

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

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

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

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

Read InterfaceBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS InterfaceBody

readList :: ReadS [InterfaceBody]

readPrec :: ReadPrec InterfaceBody

readListPrec :: ReadPrec [InterfaceBody]

Show InterfaceBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> InterfaceBody -> ShowS

show :: InterfaceBody -> String

showList :: [InterfaceBody] -> ShowS

Generic InterfaceBody Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep InterfaceBody :: Type -> Type

Pretty InterfaceBody Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: InterfaceBody -> Doc Source #

prettyPrec :: Int -> InterfaceBody -> Doc Source #

type Rep InterfaceBody Source # 
Instance details

Defined in Language.Java.Syntax

type Rep InterfaceBody = D1 ('MetaData "InterfaceBody" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'True) (C1 ('MetaCons "InterfaceBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [MemberDecl])))

data InterfaceKind Source #

Interface can declare either a normal interface or an annotation

Instances

Instances details
Eq InterfaceKind Source # 
Instance details

Defined in Language.Java.Syntax

Data InterfaceKind Source # 
Instance details

Defined in Language.Java.Syntax

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 :: forall r r'. (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 # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS InterfaceKind

readList :: ReadS [InterfaceKind]

readPrec :: ReadPrec InterfaceKind

readListPrec :: ReadPrec [InterfaceKind]

Show InterfaceKind Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> InterfaceKind -> ShowS

show :: InterfaceKind -> String

showList :: [InterfaceKind] -> ShowS

Generic InterfaceKind Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep InterfaceKind :: Type -> Type

type Rep InterfaceKind Source # 
Instance details

Defined in Language.Java.Syntax

type Rep InterfaceKind = D1 ('MetaData "InterfaceKind" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "InterfaceNormal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InterfaceAnnotation" 'PrefixI 'False) (U1 :: Type -> Type))

data Decl Source #

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

Constructors

MemberDecl MemberDecl 
InitDecl Bool Block 

Instances

Instances details
Eq Decl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Decl -> Decl -> Bool

(/=) :: Decl -> Decl -> Bool

Data Decl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Decl -> Constr

dataTypeOf :: Decl -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Decl)

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

gmapT :: (forall b. Data b => b -> b) -> Decl -> Decl

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

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

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

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

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

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

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

Read Decl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Decl

readList :: ReadS [Decl]

readPrec :: ReadPrec Decl

readListPrec :: ReadPrec [Decl]

Show Decl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Decl -> ShowS

show :: Decl -> String

showList :: [Decl] -> ShowS

Generic Decl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Decl :: Type -> Type

Methods

from :: Decl -> Rep Decl x

to :: Rep Decl x -> Decl

Pretty Decl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Decl -> Doc Source #

prettyPrec :: Int -> Decl -> Doc Source #

type Rep Decl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Decl = D1 ('MetaData "Decl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "MemberDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MemberDecl)) :+: C1 ('MetaCons "InitDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Block)))

data MemberDecl 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

FieldDecl [Modifier] Type [VarDecl]

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

MethodDecl [Modifier] [TypeParam] (Maybe Type) Ident [FormalParam] [ExceptionType] (Maybe Exp) MethodBody

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

ConstructorDecl [Modifier] [TypeParam] Ident [FormalParam] [ExceptionType] ConstructorBody

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

MemberClassDecl ClassDecl

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

MemberInterfaceDecl InterfaceDecl

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

Instances

Instances details
Eq MemberDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: MemberDecl -> MemberDecl -> Bool

(/=) :: MemberDecl -> MemberDecl -> Bool

Data MemberDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: MemberDecl -> Constr

dataTypeOf :: MemberDecl -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MemberDecl)

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

gmapT :: (forall b. Data b => b -> b) -> MemberDecl -> MemberDecl

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

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

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

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

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

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

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

Read MemberDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS MemberDecl

readList :: ReadS [MemberDecl]

readPrec :: ReadPrec MemberDecl

readListPrec :: ReadPrec [MemberDecl]

Show MemberDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> MemberDecl -> ShowS

show :: MemberDecl -> String

showList :: [MemberDecl] -> ShowS

Generic MemberDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep MemberDecl :: Type -> Type

Methods

from :: MemberDecl -> Rep MemberDecl x

to :: Rep MemberDecl x -> MemberDecl

Pretty MemberDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: MemberDecl -> Doc Source #

prettyPrec :: Int -> MemberDecl -> Doc Source #

type Rep MemberDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep MemberDecl = D1 ('MetaData "MemberDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) ((C1 ('MetaCons "FieldDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [VarDecl]))) :+: C1 ('MetaCons "MethodDecl" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeParam])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Type)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormalParam]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ExceptionType])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Exp)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MethodBody))))) :+: (C1 ('MetaCons "ConstructorDecl" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeParam]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormalParam]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ExceptionType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConstructorBody)))) :+: (C1 ('MetaCons "MemberClassDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassDecl)) :+: C1 ('MetaCons "MemberInterfaceDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InterfaceDecl)))))

data VarDecl Source #

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

Constructors

VarDecl VarDeclId (Maybe VarInit) 

Instances

Instances details
Eq VarDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

Data VarDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: VarDecl -> Constr

dataTypeOf :: VarDecl -> DataType

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

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

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

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

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

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

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

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

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

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

Read VarDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS VarDecl

readList :: ReadS [VarDecl]

readPrec :: ReadPrec VarDecl

readListPrec :: ReadPrec [VarDecl]

Show VarDecl Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> VarDecl -> ShowS

show :: VarDecl -> String

showList :: [VarDecl] -> ShowS

Generic VarDecl Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep VarDecl :: Type -> Type

Methods

from :: VarDecl -> Rep VarDecl x

to :: Rep VarDecl x -> VarDecl

Pretty VarDecl Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: VarDecl -> Doc Source #

prettyPrec :: Int -> VarDecl -> Doc Source #

type Rep VarDecl Source # 
Instance details

Defined in Language.Java.Syntax

type Rep VarDecl = D1 ('MetaData "VarDecl" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "VarDecl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VarDeclId) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe VarInit))))

data VarDeclId Source #

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

Constructors

VarId Ident 
VarDeclArray VarDeclId

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

Instances

Instances details
Eq VarDeclId Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: VarDeclId -> VarDeclId -> Bool

(/=) :: VarDeclId -> VarDeclId -> Bool

Data VarDeclId Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: VarDeclId -> Constr

dataTypeOf :: VarDeclId -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VarDeclId)

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

gmapT :: (forall b. Data b => b -> b) -> VarDeclId -> VarDeclId

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

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

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

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

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

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

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

Read VarDeclId Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS VarDeclId

readList :: ReadS [VarDeclId]

readPrec :: ReadPrec VarDeclId

readListPrec :: ReadPrec [VarDeclId]

Show VarDeclId Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> VarDeclId -> ShowS

show :: VarDeclId -> String

showList :: [VarDeclId] -> ShowS

Generic VarDeclId Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep VarDeclId :: Type -> Type

Methods

from :: VarDeclId -> Rep VarDeclId x

to :: Rep VarDeclId x -> VarDeclId

Pretty VarDeclId Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: VarDeclId -> Doc Source #

prettyPrec :: Int -> VarDeclId -> Doc Source #

type Rep VarDeclId Source # 
Instance details

Defined in Language.Java.Syntax

type Rep VarDeclId = D1 ('MetaData "VarDeclId" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "VarId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident)) :+: C1 ('MetaCons "VarDeclArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VarDeclId)))

data VarInit Source #

Explicit initializer for a variable declaration.

Instances

Instances details
Eq VarInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: VarInit -> VarInit -> Bool

(/=) :: VarInit -> VarInit -> Bool

Data VarInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: VarInit -> Constr

dataTypeOf :: VarInit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VarInit)

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

gmapT :: (forall b. Data b => b -> b) -> VarInit -> VarInit

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

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

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

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

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

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

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

Read VarInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS VarInit

readList :: ReadS [VarInit]

readPrec :: ReadPrec VarInit

readListPrec :: ReadPrec [VarInit]

Show VarInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> VarInit -> ShowS

show :: VarInit -> String

showList :: [VarInit] -> ShowS

Generic VarInit Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep VarInit :: Type -> Type

Methods

from :: VarInit -> Rep VarInit x

to :: Rep VarInit x -> VarInit

Pretty VarInit Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: VarInit -> Doc Source #

prettyPrec :: Int -> VarInit -> Doc Source #

type Rep VarInit Source # 
Instance details

Defined in Language.Java.Syntax

type Rep VarInit = D1 ('MetaData "VarInit" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "InitExp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "InitArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayInit)))

data FormalParam 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.

Constructors

FormalParam [Modifier] Type Bool VarDeclId 

Instances

Instances details
Eq FormalParam Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: FormalParam -> FormalParam -> Bool

(/=) :: FormalParam -> FormalParam -> Bool

Data FormalParam Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: FormalParam -> Constr

dataTypeOf :: FormalParam -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FormalParam)

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

gmapT :: (forall b. Data b => b -> b) -> FormalParam -> FormalParam

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

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

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

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

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

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

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

Read FormalParam Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS FormalParam

readList :: ReadS [FormalParam]

readPrec :: ReadPrec FormalParam

readListPrec :: ReadPrec [FormalParam]

Show FormalParam Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> FormalParam -> ShowS

show :: FormalParam -> String

showList :: [FormalParam] -> ShowS

Generic FormalParam Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep FormalParam :: Type -> Type

Methods

from :: FormalParam -> Rep FormalParam x

to :: Rep FormalParam x -> FormalParam

Pretty FormalParam Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: FormalParam -> Doc Source #

prettyPrec :: Int -> FormalParam -> Doc Source #

type Rep FormalParam Source # 
Instance details

Defined in Language.Java.Syntax

type Rep FormalParam = D1 ('MetaData "FormalParam" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "FormalParam" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VarDeclId))))

newtype MethodBody 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 (Maybe Block) 

Instances

Instances details
Eq MethodBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: MethodBody -> MethodBody -> Bool

(/=) :: MethodBody -> MethodBody -> Bool

Data MethodBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: MethodBody -> Constr

dataTypeOf :: MethodBody -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MethodBody)

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

gmapT :: (forall b. Data b => b -> b) -> MethodBody -> MethodBody

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

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

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

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

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

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

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

Read MethodBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS MethodBody

readList :: ReadS [MethodBody]

readPrec :: ReadPrec MethodBody

readListPrec :: ReadPrec [MethodBody]

Show MethodBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> MethodBody -> ShowS

show :: MethodBody -> String

showList :: [MethodBody] -> ShowS

Generic MethodBody Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep MethodBody :: Type -> Type

Methods

from :: MethodBody -> Rep MethodBody x

to :: Rep MethodBody x -> MethodBody

Pretty MethodBody Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: MethodBody -> Doc Source #

prettyPrec :: Int -> MethodBody -> Doc Source #

type Rep MethodBody Source # 
Instance details

Defined in Language.Java.Syntax

type Rep MethodBody = D1 ('MetaData "MethodBody" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'True) (C1 ('MetaCons "MethodBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Block))))

data ConstructorBody 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.

Constructors

ConstructorBody (Maybe ExplConstrInv) [BlockStmt] 

Instances

Instances details
Eq ConstructorBody Source # 
Instance details

Defined in Language.Java.Syntax

Data ConstructorBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ConstructorBody -> Constr

dataTypeOf :: ConstructorBody -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConstructorBody)

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

gmapT :: (forall b. Data b => b -> b) -> ConstructorBody -> ConstructorBody

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

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

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

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

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

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

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

Read ConstructorBody Source # 
Instance details

Defined in Language.Java.Syntax

Show ConstructorBody Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ConstructorBody -> ShowS

show :: ConstructorBody -> String

showList :: [ConstructorBody] -> ShowS

Generic ConstructorBody Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ConstructorBody :: Type -> Type

Pretty ConstructorBody Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ConstructorBody -> Doc Source #

prettyPrec :: Int -> ConstructorBody -> Doc Source #

type Rep ConstructorBody Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ConstructorBody = D1 ('MetaData "ConstructorBody" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ConstructorBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ExplConstrInv)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BlockStmt])))

data ExplConstrInv 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

Instances details
Eq ExplConstrInv Source # 
Instance details

Defined in Language.Java.Syntax

Data ExplConstrInv Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ExplConstrInv -> Constr

dataTypeOf :: ExplConstrInv -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExplConstrInv)

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

gmapT :: (forall b. Data b => b -> b) -> ExplConstrInv -> ExplConstrInv

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

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

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

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

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

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

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

Read ExplConstrInv Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ExplConstrInv

readList :: ReadS [ExplConstrInv]

readPrec :: ReadPrec ExplConstrInv

readListPrec :: ReadPrec [ExplConstrInv]

Show ExplConstrInv Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ExplConstrInv -> ShowS

show :: ExplConstrInv -> String

showList :: [ExplConstrInv] -> ShowS

Generic ExplConstrInv Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ExplConstrInv :: Type -> Type

Pretty ExplConstrInv Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ExplConstrInv -> Doc Source #

prettyPrec :: Int -> ExplConstrInv -> Doc Source #

type Rep ExplConstrInv Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ExplConstrInv = D1 ('MetaData "ExplConstrInv" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ThisInvoke" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument])) :+: (C1 ('MetaCons "SuperInvoke" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument])) :+: C1 ('MetaCons "PrimarySuperInvoke" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument])))))

data Modifier 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

Instances details
Eq Modifier Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Modifier -> Modifier -> Bool

(/=) :: Modifier -> Modifier -> Bool

Data Modifier Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Modifier -> Constr

dataTypeOf :: Modifier -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Modifier)

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

gmapT :: (forall b. Data b => b -> b) -> Modifier -> Modifier

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

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

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

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

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

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

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

Read Modifier Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Modifier

readList :: ReadS [Modifier]

readPrec :: ReadPrec Modifier

readListPrec :: ReadPrec [Modifier]

Show Modifier Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Modifier -> ShowS

show :: Modifier -> String

showList :: [Modifier] -> ShowS

Generic Modifier Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Modifier :: Type -> Type

Methods

from :: Modifier -> Rep Modifier x

to :: Rep Modifier x -> Modifier

Pretty Modifier Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Modifier -> Doc Source #

prettyPrec :: Int -> Modifier -> Doc Source #

type Rep Modifier Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Modifier = D1 ('MetaData "Modifier" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (((C1 ('MetaCons "Public" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Private" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Protected" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "Abstract" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Final" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Static" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "StrictFP" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Transient" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Volatile" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "Native" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Annotation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Annotation)) :+: C1 ('MetaCons "Synchronized_" 'PrefixI 'False) (U1 :: Type -> Type)))))

data Annotation Source #

Annotations have three different forms: no-parameter, single-parameter or key-value pairs

Instances

Instances details
Eq Annotation Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Annotation -> Annotation -> Bool

(/=) :: Annotation -> Annotation -> Bool

Data Annotation Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Annotation -> Constr

dataTypeOf :: Annotation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Annotation)

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

gmapT :: (forall b. Data b => b -> b) -> Annotation -> Annotation

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

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

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

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

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

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

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

Read Annotation Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Annotation

readList :: ReadS [Annotation]

readPrec :: ReadPrec Annotation

readListPrec :: ReadPrec [Annotation]

Show Annotation Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Annotation -> ShowS

show :: Annotation -> String

showList :: [Annotation] -> ShowS

Generic Annotation Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Annotation :: Type -> Type

Methods

from :: Annotation -> Rep Annotation x

to :: Rep Annotation x -> Annotation

Pretty Annotation Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Annotation -> Doc Source #

prettyPrec :: Int -> Annotation -> Doc Source #

type Rep Annotation Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Annotation = D1 ('MetaData "Annotation" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "NormalAnnotation" 'PrefixI 'True) (S1 ('MetaSel ('Just "annName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Just "annKV") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Ident, ElementValue)])) :+: (C1 ('MetaCons "SingleElementAnnotation" 'PrefixI 'True) (S1 ('MetaSel ('Just "annName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Just "annValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ElementValue)) :+: C1 ('MetaCons "MarkerAnnotation" 'PrefixI 'True) (S1 ('MetaSel ('Just "annName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))))

data ElementValue Source #

Annotations may contain annotations or (loosely) expressions

Constructors

EVVal VarInit 
EVAnn Annotation 

Instances

Instances details
Eq ElementValue Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: ElementValue -> ElementValue -> Bool

(/=) :: ElementValue -> ElementValue -> Bool

Data ElementValue Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ElementValue -> Constr

dataTypeOf :: ElementValue -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ElementValue)

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

gmapT :: (forall b. Data b => b -> b) -> ElementValue -> ElementValue

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

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

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

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

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

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

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

Read ElementValue Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ElementValue

readList :: ReadS [ElementValue]

readPrec :: ReadPrec ElementValue

readListPrec :: ReadPrec [ElementValue]

Show ElementValue Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ElementValue -> ShowS

show :: ElementValue -> String

showList :: [ElementValue] -> ShowS

Generic ElementValue Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ElementValue :: Type -> Type

Pretty ElementValue Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ElementValue -> Doc Source #

prettyPrec :: Int -> ElementValue -> Doc Source #

type Rep ElementValue Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ElementValue = D1 ('MetaData "ElementValue" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "EVVal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VarInit)) :+: C1 ('MetaCons "EVAnn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Annotation)))

data Block Source #

A block is a sequence of statements, local class declarations and local variable declaration statements within braces.

Constructors

Block [BlockStmt] 

Instances

Instances details
Eq Block Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Block -> Block -> Bool

(/=) :: Block -> Block -> Bool

Data Block Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Block -> Constr

dataTypeOf :: Block -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Block)

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

gmapT :: (forall b. Data b => b -> b) -> Block -> Block

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

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

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

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

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

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

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

Read Block Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Block

readList :: ReadS [Block]

readPrec :: ReadPrec Block

readListPrec :: ReadPrec [Block]

Show Block Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Block -> ShowS

show :: Block -> String

showList :: [Block] -> ShowS

Generic Block Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Block :: Type -> Type

Methods

from :: Block -> Rep Block x

to :: Rep Block x -> Block

Pretty Block Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Block -> Doc Source #

prettyPrec :: Int -> Block -> Doc Source #

type Rep Block Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Block = D1 ('MetaData "Block" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "Block" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BlockStmt])))

data BlockStmt Source #

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

Instances

Instances details
Eq BlockStmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: BlockStmt -> BlockStmt -> Bool

(/=) :: BlockStmt -> BlockStmt -> Bool

Data BlockStmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: BlockStmt -> Constr

dataTypeOf :: BlockStmt -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BlockStmt)

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

gmapT :: (forall b. Data b => b -> b) -> BlockStmt -> BlockStmt

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

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

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

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

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

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

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

Read BlockStmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS BlockStmt

readList :: ReadS [BlockStmt]

readPrec :: ReadPrec BlockStmt

readListPrec :: ReadPrec [BlockStmt]

Show BlockStmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> BlockStmt -> ShowS

show :: BlockStmt -> String

showList :: [BlockStmt] -> ShowS

Generic BlockStmt Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep BlockStmt :: Type -> Type

Methods

from :: BlockStmt -> Rep BlockStmt x

to :: Rep BlockStmt x -> BlockStmt

Pretty BlockStmt Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: BlockStmt -> Doc Source #

prettyPrec :: Int -> BlockStmt -> Doc Source #

type Rep BlockStmt Source # 
Instance details

Defined in Language.Java.Syntax

type Rep BlockStmt = D1 ('MetaData "BlockStmt" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "BlockStmt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt)) :+: (C1 ('MetaCons "LocalClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassDecl)) :+: C1 ('MetaCons "LocalVars" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [VarDecl])))))

data Stmt Source #

A Java statement.

Constructors

StmtBlock Block

A statement can be a nested block.

IfThen Exp Stmt

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

IfThenElse Exp Stmt Stmt

The if-then-else statement allows conditional choice of two statements, executing one or the other but not both.

While Exp Stmt

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

BasicFor (Maybe ForInit) (Maybe Exp) (Maybe [Exp]) Stmt

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.

EnhancedFor [Modifier] Type Ident Exp Stmt

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

Empty

An empty statement does nothing.

ExpStmt Exp

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.

Assert Exp (Maybe Exp)

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

Switch Exp [SwitchBlock]

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

Do Stmt Exp

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

Break (Maybe Ident)

A break statement transfers control out of an enclosing statement.

Continue (Maybe Ident)

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

Return (Maybe Exp) 
Synchronized Exp Block

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.

Throw Exp

A throw statement causes an exception to be thrown.

Try Block [Catch] (Maybe Block)

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.

Labeled Ident Stmt

Statements may have label prefixes.

Instances

Instances details
Eq Stmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Stmt -> Stmt -> Bool

(/=) :: Stmt -> Stmt -> Bool

Data Stmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Stmt -> Constr

dataTypeOf :: Stmt -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Stmt)

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

gmapT :: (forall b. Data b => b -> b) -> Stmt -> Stmt

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

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

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

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

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

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

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

Read Stmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Stmt

readList :: ReadS [Stmt]

readPrec :: ReadPrec Stmt

readListPrec :: ReadPrec [Stmt]

Show Stmt Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS

show :: Stmt -> String

showList :: [Stmt] -> ShowS

Generic Stmt Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Stmt :: Type -> Type

Methods

from :: Stmt -> Rep Stmt x

to :: Rep Stmt x -> Stmt

Pretty Stmt Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Stmt -> Doc Source #

prettyPrec :: Int -> Stmt -> Doc Source #

type Rep Stmt Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Stmt = D1 ('MetaData "Stmt" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) ((((C1 ('MetaCons "StmtBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Block)) :+: C1 ('MetaCons "IfThen" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt))) :+: (C1 ('MetaCons "IfThenElse" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt))) :+: C1 ('MetaCons "While" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt)))) :+: ((C1 ('MetaCons "BasicFor" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ForInit)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Exp))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Exp])) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt))) :+: C1 ('MetaCons "EnhancedFor" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt))))) :+: (C1 ('MetaCons "Empty" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ExpStmt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "Assert" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Exp))))))) :+: (((C1 ('MetaCons "Switch" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SwitchBlock])) :+: C1 ('MetaCons "Do" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: (C1 ('MetaCons "Break" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Ident))) :+: C1 ('MetaCons "Continue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Ident))))) :+: ((C1 ('MetaCons "Return" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Exp))) :+: C1 ('MetaCons "Synchronized" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Block))) :+: (C1 ('MetaCons "Throw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: (C1 ('MetaCons "Try" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Block) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Catch]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Block)))) :+: C1 ('MetaCons "Labeled" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Stmt)))))))

data Catch 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 FormalParam Block 

Instances

Instances details
Eq Catch Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Catch -> Catch -> Bool

(/=) :: Catch -> Catch -> Bool

Data Catch Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Catch -> Constr

dataTypeOf :: Catch -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Catch)

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

gmapT :: (forall b. Data b => b -> b) -> Catch -> Catch

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

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

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

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

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

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

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

Read Catch Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Catch

readList :: ReadS [Catch]

readPrec :: ReadPrec Catch

readListPrec :: ReadPrec [Catch]

Show Catch Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Catch -> ShowS

show :: Catch -> String

showList :: [Catch] -> ShowS

Generic Catch Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Catch :: Type -> Type

Methods

from :: Catch -> Rep Catch x

to :: Rep Catch x -> Catch

Pretty Catch Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Catch -> Doc Source #

prettyPrec :: Int -> Catch -> Doc Source #

type Rep Catch Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Catch = D1 ('MetaData "Catch" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "Catch" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FormalParam) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Block)))

data SwitchBlock Source #

A block of code labelled with a case or default within a switch statement.

Instances

Instances details
Eq SwitchBlock Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: SwitchBlock -> SwitchBlock -> Bool

(/=) :: SwitchBlock -> SwitchBlock -> Bool

Data SwitchBlock Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: SwitchBlock -> Constr

dataTypeOf :: SwitchBlock -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SwitchBlock)

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

gmapT :: (forall b. Data b => b -> b) -> SwitchBlock -> SwitchBlock

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

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

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

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

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

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

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

Read SwitchBlock Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS SwitchBlock

readList :: ReadS [SwitchBlock]

readPrec :: ReadPrec SwitchBlock

readListPrec :: ReadPrec [SwitchBlock]

Show SwitchBlock Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> SwitchBlock -> ShowS

show :: SwitchBlock -> String

showList :: [SwitchBlock] -> ShowS

Generic SwitchBlock Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep SwitchBlock :: Type -> Type

Methods

from :: SwitchBlock -> Rep SwitchBlock x

to :: Rep SwitchBlock x -> SwitchBlock

Pretty SwitchBlock Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: SwitchBlock -> Doc Source #

prettyPrec :: Int -> SwitchBlock -> Doc Source #

type Rep SwitchBlock Source # 
Instance details

Defined in Language.Java.Syntax

type Rep SwitchBlock = D1 ('MetaData "SwitchBlock" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "SwitchBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SwitchLabel) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BlockStmt])))

data SwitchLabel Source #

A label within a switch statement.

Constructors

SwitchCase Exp

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

Default 

Instances

Instances details
Eq SwitchLabel Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: SwitchLabel -> SwitchLabel -> Bool

(/=) :: SwitchLabel -> SwitchLabel -> Bool

Data SwitchLabel Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: SwitchLabel -> Constr

dataTypeOf :: SwitchLabel -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SwitchLabel)

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

gmapT :: (forall b. Data b => b -> b) -> SwitchLabel -> SwitchLabel

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

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

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

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

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

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

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

Read SwitchLabel Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS SwitchLabel

readList :: ReadS [SwitchLabel]

readPrec :: ReadPrec SwitchLabel

readListPrec :: ReadPrec [SwitchLabel]

Show SwitchLabel Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> SwitchLabel -> ShowS

show :: SwitchLabel -> String

showList :: [SwitchLabel] -> ShowS

Generic SwitchLabel Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep SwitchLabel :: Type -> Type

Methods

from :: SwitchLabel -> Rep SwitchLabel x

to :: Rep SwitchLabel x -> SwitchLabel

Pretty SwitchLabel Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: SwitchLabel -> Doc Source #

prettyPrec :: Int -> SwitchLabel -> Doc Source #

type Rep SwitchLabel Source # 
Instance details

Defined in Language.Java.Syntax

type Rep SwitchLabel = D1 ('MetaData "SwitchLabel" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "SwitchCase" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "Default" 'PrefixI 'False) (U1 :: Type -> Type))

data ForInit Source #

Initialization code for a basic for statement.

Instances

Instances details
Eq ForInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: ForInit -> ForInit -> Bool

(/=) :: ForInit -> ForInit -> Bool

Data ForInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ForInit -> Constr

dataTypeOf :: ForInit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForInit)

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

gmapT :: (forall b. Data b => b -> b) -> ForInit -> ForInit

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

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

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

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

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

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

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

Read ForInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ForInit

readList :: ReadS [ForInit]

readPrec :: ReadPrec ForInit

readListPrec :: ReadPrec [ForInit]

Show ForInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ForInit -> ShowS

show :: ForInit -> String

showList :: [ForInit] -> ShowS

Generic ForInit Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ForInit :: Type -> Type

Methods

from :: ForInit -> Rep ForInit x

to :: Rep ForInit x -> ForInit

Pretty ForInit Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ForInit -> Doc Source #

prettyPrec :: Int -> ForInit -> Doc Source #

type Rep ForInit Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ForInit = D1 ('MetaData "ForInit" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ForLocalVars" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Modifier]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [VarDecl]))) :+: C1 ('MetaCons "ForInitExps" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Exp])))

type ExceptionType = RefType Source #

An exception type has to be a class type or a type variable.

type Argument = Exp Source #

Arguments to methods and constructors are expressions.

data Exp Source #

A Java expression.

Constructors

Lit Literal

A literal denotes a fixed, unchanging value.

ClassLit (Maybe Type)

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.

This

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.

ThisClass Name

Any lexically enclosing instance can be referred to by explicitly qualifying the keyword this.

InstanceCreation [TypeArgument] TypeDeclSpecifier [Argument] (Maybe ClassBody)

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.

QualInstanceCreation Exp [TypeArgument] Ident [Argument] (Maybe ClassBody)

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

ArrayCreate Type [Exp] Int

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.

ArrayCreateInit Type Int ArrayInit

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

FieldAccess FieldAccess

A field access expression.

MethodInv MethodInvocation

A method invocation expression.

ArrayAccess ArrayIndex

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

ExpName Name

An expression name, e.g. a variable.

PostIncrement Exp

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

PostDecrement Exp

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

PreIncrement Exp

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

PreDecrement Exp

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

PrePlus Exp

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

PreMinus Exp

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

PreBitCompl Exp

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

PreNot Exp

Logical complementation of boolean values.

Cast Type Exp

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.

BinOp Exp Op Exp

The application of a binary operator to two operand expressions.

InstanceOf Exp RefType

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

Cond Exp Exp Exp

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

Assign Lhs AssignOp Exp

Assignment of the result of an expression to a variable.

Lambda LambdaParams LambdaExpression

Lambda expression

MethodRef Name Ident

Method reference

Instances

Instances details
Eq Exp Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Exp -> Exp -> Bool

(/=) :: Exp -> Exp -> Bool

Data Exp Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Exp -> Constr

dataTypeOf :: Exp -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Exp)

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

gmapT :: (forall b. Data b => b -> b) -> Exp -> Exp

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

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

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

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

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

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

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

Read Exp Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Exp

readList :: ReadS [Exp]

readPrec :: ReadPrec Exp

readListPrec :: ReadPrec [Exp]

Show Exp Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS

show :: Exp -> String

showList :: [Exp] -> ShowS

Generic Exp Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Exp :: Type -> Type

Methods

from :: Exp -> Rep Exp x

to :: Rep Exp x -> Exp

Pretty Exp Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Exp -> Doc Source #

prettyPrec :: Int -> Exp -> Doc Source #

type Rep Exp Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Exp = D1 ('MetaData "Exp" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) ((((C1 ('MetaCons "Lit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Literal)) :+: (C1 ('MetaCons "ClassLit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Type))) :+: C1 ('MetaCons "This" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "ThisClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: (C1 ('MetaCons "InstanceCreation" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeArgument]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeDeclSpecifier)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ClassBody)))) :+: C1 ('MetaCons "QualInstanceCreation" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeArgument])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ClassBody)))))))) :+: ((C1 ('MetaCons "ArrayCreate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Exp]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "ArrayCreateInit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayInit))) :+: C1 ('MetaCons "FieldAccess" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FieldAccess)))) :+: ((C1 ('MetaCons "MethodInv" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MethodInvocation)) :+: C1 ('MetaCons "ArrayAccess" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayIndex))) :+: (C1 ('MetaCons "ExpName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "PostIncrement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))))) :+: (((C1 ('MetaCons "PostDecrement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: (C1 ('MetaCons "PreIncrement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "PreDecrement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))) :+: ((C1 ('MetaCons "PrePlus" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "PreMinus" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: (C1 ('MetaCons "PreBitCompl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "PreNot" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))))) :+: ((C1 ('MetaCons "Cast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: (C1 ('MetaCons "BinOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Op) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: C1 ('MetaCons "InstanceOf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefType)))) :+: ((C1 ('MetaCons "Cond" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: C1 ('MetaCons "Assign" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Lhs) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssignOp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))) :+: (C1 ('MetaCons "Lambda" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LambdaParams) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LambdaExpression)) :+: C1 ('MetaCons "MethodRef" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident)))))))

data Lhs 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

NameLhs Name

Assign to a variable

FieldLhs FieldAccess

Assign through a field access

ArrayLhs ArrayIndex

Assign to an array

Instances

Instances details
Eq Lhs Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: Lhs -> Lhs -> Bool

(/=) :: Lhs -> Lhs -> Bool

Data Lhs Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: Lhs -> Constr

dataTypeOf :: Lhs -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Lhs)

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

gmapT :: (forall b. Data b => b -> b) -> Lhs -> Lhs

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

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

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

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

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

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

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

Read Lhs Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS Lhs

readList :: ReadS [Lhs]

readPrec :: ReadPrec Lhs

readListPrec :: ReadPrec [Lhs]

Show Lhs Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> Lhs -> ShowS

show :: Lhs -> String

showList :: [Lhs] -> ShowS

Generic Lhs Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep Lhs :: Type -> Type

Methods

from :: Lhs -> Rep Lhs x

to :: Rep Lhs x -> Lhs

Pretty Lhs Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Lhs -> Doc Source #

prettyPrec :: Int -> Lhs -> Doc Source #

type Rep Lhs Source # 
Instance details

Defined in Language.Java.Syntax

type Rep Lhs = D1 ('MetaData "Lhs" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "NameLhs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: (C1 ('MetaCons "FieldLhs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FieldAccess)) :+: C1 ('MetaCons "ArrayLhs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayIndex))))

data ArrayIndex Source #

Array access

Constructors

ArrayIndex Exp [Exp]

Index into an array

Instances

Instances details
Eq ArrayIndex Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: ArrayIndex -> ArrayIndex -> Bool

(/=) :: ArrayIndex -> ArrayIndex -> Bool

Data ArrayIndex Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ArrayIndex -> Constr

dataTypeOf :: ArrayIndex -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ArrayIndex)

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

gmapT :: (forall b. Data b => b -> b) -> ArrayIndex -> ArrayIndex

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

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

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

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

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

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

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

Read ArrayIndex Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ArrayIndex

readList :: ReadS [ArrayIndex]

readPrec :: ReadPrec ArrayIndex

readListPrec :: ReadPrec [ArrayIndex]

Show ArrayIndex Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ArrayIndex -> ShowS

show :: ArrayIndex -> String

showList :: [ArrayIndex] -> ShowS

Generic ArrayIndex Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ArrayIndex :: Type -> Type

Methods

from :: ArrayIndex -> Rep ArrayIndex x

to :: Rep ArrayIndex x -> ArrayIndex

Pretty ArrayIndex Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ArrayIndex -> Doc Source #

prettyPrec :: Int -> ArrayIndex -> Doc Source #

type Rep ArrayIndex Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ArrayIndex = D1 ('MetaData "ArrayIndex" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ArrayIndex" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Exp])))

data FieldAccess 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

PrimaryFieldAccess Exp Ident

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

SuperFieldAccess Ident

Accessing a field of the superclass.

ClassFieldAccess Name Ident

Accessing a (static) field of a named class.

Instances

Instances details
Eq FieldAccess Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: FieldAccess -> FieldAccess -> Bool

(/=) :: FieldAccess -> FieldAccess -> Bool

Data FieldAccess Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: FieldAccess -> Constr

dataTypeOf :: FieldAccess -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FieldAccess)

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

gmapT :: (forall b. Data b => b -> b) -> FieldAccess -> FieldAccess

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

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

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

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

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

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

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

Read FieldAccess Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS FieldAccess

readList :: ReadS [FieldAccess]

readPrec :: ReadPrec FieldAccess

readListPrec :: ReadPrec [FieldAccess]

Show FieldAccess Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> FieldAccess -> ShowS

show :: FieldAccess -> String

showList :: [FieldAccess] -> ShowS

Generic FieldAccess Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep FieldAccess :: Type -> Type

Methods

from :: FieldAccess -> Rep FieldAccess x

to :: Rep FieldAccess x -> FieldAccess

Pretty FieldAccess Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: FieldAccess -> Doc Source #

prettyPrec :: Int -> FieldAccess -> Doc Source #

type Rep FieldAccess Source # 
Instance details

Defined in Language.Java.Syntax

type Rep FieldAccess = D1 ('MetaData "FieldAccess" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "PrimaryFieldAccess" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident)) :+: (C1 ('MetaCons "SuperFieldAccess" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident)) :+: C1 ('MetaCons "ClassFieldAccess" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident))))

data LambdaParams Source #

Instances

Instances details
Eq LambdaParams Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: LambdaParams -> LambdaParams -> Bool

(/=) :: LambdaParams -> LambdaParams -> Bool

Data LambdaParams Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: LambdaParams -> Constr

dataTypeOf :: LambdaParams -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LambdaParams)

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

gmapT :: (forall b. Data b => b -> b) -> LambdaParams -> LambdaParams

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

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

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

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

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

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

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

Read LambdaParams Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS LambdaParams

readList :: ReadS [LambdaParams]

readPrec :: ReadPrec LambdaParams

readListPrec :: ReadPrec [LambdaParams]

Show LambdaParams Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> LambdaParams -> ShowS

show :: LambdaParams -> String

showList :: [LambdaParams] -> ShowS

Generic LambdaParams Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep LambdaParams :: Type -> Type

Pretty LambdaParams Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: LambdaParams -> Doc Source #

prettyPrec :: Int -> LambdaParams -> Doc Source #

type Rep LambdaParams Source # 
Instance details

Defined in Language.Java.Syntax

type Rep LambdaParams = D1 ('MetaData "LambdaParams" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "LambdaSingleParam" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident)) :+: (C1 ('MetaCons "LambdaFormalParams" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FormalParam])) :+: C1 ('MetaCons "LambdaInferredParams" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ident]))))

data LambdaExpression Source #

Lambda expression, starting from java 8

Instances

Instances details
Eq LambdaExpression Source # 
Instance details

Defined in Language.Java.Syntax

Data LambdaExpression Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: LambdaExpression -> Constr

dataTypeOf :: LambdaExpression -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LambdaExpression)

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

gmapT :: (forall b. Data b => b -> b) -> LambdaExpression -> LambdaExpression

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

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

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

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

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

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

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

Read LambdaExpression Source # 
Instance details

Defined in Language.Java.Syntax

Show LambdaExpression Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> LambdaExpression -> ShowS

show :: LambdaExpression -> String

showList :: [LambdaExpression] -> ShowS

Generic LambdaExpression Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep LambdaExpression :: Type -> Type

Pretty LambdaExpression Source # 
Instance details

Defined in Language.Java.Pretty

type Rep LambdaExpression Source # 
Instance details

Defined in Language.Java.Syntax

type Rep LambdaExpression = D1 ('MetaData "LambdaExpression" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "LambdaExpression" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "LambdaBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Block)))

data ArrayInit 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 [VarInit] 

Instances

Instances details
Eq ArrayInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

(==) :: ArrayInit -> ArrayInit -> Bool

(/=) :: ArrayInit -> ArrayInit -> Bool

Data ArrayInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: ArrayInit -> Constr

dataTypeOf :: ArrayInit -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ArrayInit)

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

gmapT :: (forall b. Data b => b -> b) -> ArrayInit -> ArrayInit

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

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

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

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

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

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

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

Read ArrayInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

readsPrec :: Int -> ReadS ArrayInit

readList :: ReadS [ArrayInit]

readPrec :: ReadPrec ArrayInit

readListPrec :: ReadPrec [ArrayInit]

Show ArrayInit Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> ArrayInit -> ShowS

show :: ArrayInit -> String

showList :: [ArrayInit] -> ShowS

Generic ArrayInit Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep ArrayInit :: Type -> Type

Methods

from :: ArrayInit -> Rep ArrayInit x

to :: Rep ArrayInit x -> ArrayInit

Pretty ArrayInit Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ArrayInit -> Doc Source #

prettyPrec :: Int -> ArrayInit -> Doc Source #

type Rep ArrayInit Source # 
Instance details

Defined in Language.Java.Syntax

type Rep ArrayInit = D1 ('MetaData "ArrayInit" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ArrayInit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [VarInit])))

data MethodInvocation Source #

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

Constructors

MethodCall Name [Argument]

Invoking a specific named method.

PrimaryMethodCall Exp [RefType] Ident [Argument]

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

SuperMethodCall [RefType] Ident [Argument]

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

ClassMethodCall Name [RefType] Ident [Argument]

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

TypeMethodCall Name [RefType] Ident [Argument]

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

Instances

Instances details
Eq MethodInvocation Source # 
Instance details

Defined in Language.Java.Syntax

Data MethodInvocation Source # 
Instance details

Defined in Language.Java.Syntax

Methods

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

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

toConstr :: MethodInvocation -> Constr

dataTypeOf :: MethodInvocation -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MethodInvocation)

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

gmapT :: (forall b. Data b => b -> b) -> MethodInvocation -> MethodInvocation

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

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

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

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

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

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

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

Read MethodInvocation Source # 
Instance details

Defined in Language.Java.Syntax

Show MethodInvocation Source # 
Instance details

Defined in Language.Java.Syntax

Methods

showsPrec :: Int -> MethodInvocation -> ShowS

show :: MethodInvocation -> String

showList :: [MethodInvocation] -> ShowS

Generic MethodInvocation Source # 
Instance details

Defined in Language.Java.Syntax

Associated Types

type Rep MethodInvocation :: Type -> Type

Pretty MethodInvocation Source # 
Instance details

Defined in Language.Java.Pretty

type Rep MethodInvocation Source # 
Instance details

Defined in Language.Java.Syntax

type Rep MethodInvocation = D1 ('MetaData "MethodInvocation" "Language.Java.Syntax" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) ((C1 ('MetaCons "MethodCall" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument])) :+: C1 ('MetaCons "PrimaryMethodCall" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument])))) :+: (C1 ('MetaCons "SuperMethodCall" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument]))) :+: (C1 ('MetaCons "ClassMethodCall" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument]))) :+: C1 ('MetaCons "TypeMethodCall" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Argument]))))))

data Literal Source #

A literal denotes a fixed, unchanging value.

Constructors

Int Integer 
Word Integer 
Float Double 
Double Double 
Boolean Bool 
Char Char 
String String 
Null 

Instances

Instances details
Eq Literal Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

(==) :: Literal -> Literal -> Bool

(/=) :: Literal -> Literal -> Bool

Data Literal Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

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

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

toConstr :: Literal -> Constr

dataTypeOf :: Literal -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Literal)

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

gmapT :: (forall b. Data b => b -> b) -> Literal -> Literal

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

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

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

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

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

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

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

Read Literal Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

readsPrec :: Int -> ReadS Literal

readList :: ReadS [Literal]

readPrec :: ReadPrec Literal

readListPrec :: ReadPrec [Literal]

Show Literal Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

showsPrec :: Int -> Literal -> ShowS

show :: Literal -> String

showList :: [Literal] -> ShowS

Generic Literal Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Associated Types

type Rep Literal :: Type -> Type

Methods

from :: Literal -> Rep Literal x

to :: Rep Literal x -> Literal

Pretty Literal Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Literal -> Doc Source #

prettyPrec :: Int -> Literal -> Doc Source #

type Rep Literal Source # 
Instance details

Defined in Language.Java.Syntax.Exp

type Rep Literal = D1 ('MetaData "Literal" "Language.Java.Syntax.Exp" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (((C1 ('MetaCons "Int" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :+: C1 ('MetaCons "Word" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer))) :+: (C1 ('MetaCons "Float" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double)) :+: C1 ('MetaCons "Double" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double)))) :+: ((C1 ('MetaCons "Boolean" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :+: C1 ('MetaCons "Char" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char))) :+: (C1 ('MetaCons "String" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "Null" 'PrefixI 'False) (U1 :: Type -> Type))))

data Op Source #

A binary infix operator.

Instances

Instances details
Eq Op Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

(==) :: Op -> Op -> Bool

(/=) :: Op -> Op -> Bool

Data Op Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

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

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

toConstr :: Op -> Constr

dataTypeOf :: Op -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Op)

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

gmapT :: (forall b. Data b => b -> b) -> Op -> Op

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

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

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

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

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

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

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

Read Op Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

readsPrec :: Int -> ReadS Op

readList :: ReadS [Op]

readPrec :: ReadPrec Op

readListPrec :: ReadPrec [Op]

Show Op Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

showsPrec :: Int -> Op -> ShowS

show :: Op -> String

showList :: [Op] -> ShowS

Generic Op Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Associated Types

type Rep Op :: Type -> Type

Methods

from :: Op -> Rep Op x

to :: Rep Op x -> Op

Pretty Op Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Op -> Doc Source #

prettyPrec :: Int -> Op -> Doc Source #

type Rep Op Source # 
Instance details

Defined in Language.Java.Syntax.Exp

type Rep Op = D1 ('MetaData "Op" "Language.Java.Syntax.Exp" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) ((((C1 ('MetaCons "Mult" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Div" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Rem" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Add" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Sub" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LShift" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RShift" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RRShift" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LThan" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "GThan" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LThanE" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GThanE" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Equal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotEq" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "And" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Or" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Xor" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CAnd" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "COr" 'PrefixI 'False) (U1 :: Type -> Type))))))

data AssignOp Source #

An assignment operator.

Instances

Instances details
Eq AssignOp Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

(==) :: AssignOp -> AssignOp -> Bool

(/=) :: AssignOp -> AssignOp -> Bool

Data AssignOp Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

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

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

toConstr :: AssignOp -> Constr

dataTypeOf :: AssignOp -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AssignOp)

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

gmapT :: (forall b. Data b => b -> b) -> AssignOp -> AssignOp

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

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

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

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

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

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

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

Read AssignOp Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

readsPrec :: Int -> ReadS AssignOp

readList :: ReadS [AssignOp]

readPrec :: ReadPrec AssignOp

readListPrec :: ReadPrec [AssignOp]

Show AssignOp Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Methods

showsPrec :: Int -> AssignOp -> ShowS

show :: AssignOp -> String

showList :: [AssignOp] -> ShowS

Generic AssignOp Source # 
Instance details

Defined in Language.Java.Syntax.Exp

Associated Types

type Rep AssignOp :: Type -> Type

Methods

from :: AssignOp -> Rep AssignOp x

to :: Rep AssignOp x -> AssignOp

Pretty AssignOp Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: AssignOp -> Doc Source #

prettyPrec :: Int -> AssignOp -> Doc Source #

type Rep AssignOp Source # 
Instance details

Defined in Language.Java.Syntax.Exp

type Rep AssignOp = D1 ('MetaData "AssignOp" "Language.Java.Syntax.Exp" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (((C1 ('MetaCons "EqualA" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MultA" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DivA" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "RemA" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AddA" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SubA" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "LShiftA" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RShiftA" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RRShiftA" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "AndA" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "XorA" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OrA" 'PrefixI 'False) (U1 :: Type -> Type)))))

data Type Source #

There are two kinds of types in the Java programming language: primitive types and reference types.

Instances

Instances details
Eq Type Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: Type -> Type -> Bool

(/=) :: Type -> Type -> Bool

Data Type Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: Type -> Constr

dataTypeOf :: Type -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type)

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

gmapT :: (forall b. Data b => b -> b) -> Type -> Type

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

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

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

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

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

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

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

Read Type Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS Type

readList :: ReadS [Type]

readPrec :: ReadPrec Type

readListPrec :: ReadPrec [Type]

Show Type Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> Type -> ShowS

show :: Type -> String

showList :: [Type] -> ShowS

Generic Type Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep Type :: Type -> Type

Methods

from :: Type -> Rep Type x

to :: Rep Type x -> Type

Pretty Type Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Type -> Doc Source #

prettyPrec :: Int -> Type -> Doc Source #

type Rep Type Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep Type = D1 ('MetaData "Type" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "PrimType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PrimType)) :+: C1 ('MetaCons "RefType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefType)))

data RefType Source #

There are three kinds of reference types: class types, interface types, and array types. Reference types may be parameterized with type arguments. Type variables cannot be syntactically distinguished from class type identifiers, and are thus represented uniformly as single ident class types.

Constructors

ClassRefType ClassType 
ArrayType Type

TypeVariable Ident

Instances

Instances details
Eq RefType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: RefType -> RefType -> Bool

(/=) :: RefType -> RefType -> Bool

Data RefType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: RefType -> Constr

dataTypeOf :: RefType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RefType)

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

gmapT :: (forall b. Data b => b -> b) -> RefType -> RefType

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

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

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

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

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

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

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

Read RefType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS RefType

readList :: ReadS [RefType]

readPrec :: ReadPrec RefType

readListPrec :: ReadPrec [RefType]

Show RefType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> RefType -> ShowS

show :: RefType -> String

showList :: [RefType] -> ShowS

Generic RefType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep RefType :: Type -> Type

Methods

from :: RefType -> Rep RefType x

to :: Rep RefType x -> RefType

Pretty RefType Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: RefType -> Doc Source #

prettyPrec :: Int -> RefType -> Doc Source #

type Rep RefType Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep RefType = D1 ('MetaData "RefType" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ClassRefType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassType)) :+: C1 ('MetaCons "ArrayType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))

data ClassType Source #

A class or interface type consists of a type declaration specifier, optionally followed by type arguments (in which case it is a parameterized type).

Constructors

ClassType [(Ident, [TypeArgument])] 

Instances

Instances details
Eq ClassType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: ClassType -> ClassType -> Bool

(/=) :: ClassType -> ClassType -> Bool

Data ClassType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: ClassType -> Constr

dataTypeOf :: ClassType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ClassType)

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

gmapT :: (forall b. Data b => b -> b) -> ClassType -> ClassType

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

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

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

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

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

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

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

Read ClassType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS ClassType

readList :: ReadS [ClassType]

readPrec :: ReadPrec ClassType

readListPrec :: ReadPrec [ClassType]

Show ClassType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> ClassType -> ShowS

show :: ClassType -> String

showList :: [ClassType] -> ShowS

Generic ClassType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep ClassType :: Type -> Type

Methods

from :: ClassType -> Rep ClassType x

to :: Rep ClassType x -> ClassType

Pretty ClassType Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: ClassType -> Doc Source #

prettyPrec :: Int -> ClassType -> Doc Source #

type Rep ClassType Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep ClassType = D1 ('MetaData "ClassType" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ClassType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Ident, [TypeArgument])])))

data TypeArgument Source #

Type arguments may be either reference types or wildcards.

Constructors

Wildcard (Maybe WildcardBound) 
ActualType RefType 

Instances

Instances details
Eq TypeArgument Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: TypeArgument -> TypeArgument -> Bool

(/=) :: TypeArgument -> TypeArgument -> Bool

Data TypeArgument Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: TypeArgument -> Constr

dataTypeOf :: TypeArgument -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeArgument)

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

gmapT :: (forall b. Data b => b -> b) -> TypeArgument -> TypeArgument

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

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

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

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

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

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

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

Read TypeArgument Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS TypeArgument

readList :: ReadS [TypeArgument]

readPrec :: ReadPrec TypeArgument

readListPrec :: ReadPrec [TypeArgument]

Show TypeArgument Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> TypeArgument -> ShowS

show :: TypeArgument -> String

showList :: [TypeArgument] -> ShowS

Generic TypeArgument Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep TypeArgument :: Type -> Type

Pretty TypeArgument Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: TypeArgument -> Doc Source #

prettyPrec :: Int -> TypeArgument -> Doc Source #

type Rep TypeArgument Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep TypeArgument = D1 ('MetaData "TypeArgument" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "Wildcard" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe WildcardBound))) :+: C1 ('MetaCons "ActualType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefType)))

data TypeDeclSpecifier Source #

Instances

Instances details
Eq TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Syntax.Types

Data TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: TypeDeclSpecifier -> Constr

dataTypeOf :: TypeDeclSpecifier -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeDeclSpecifier)

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

gmapT :: (forall b. Data b => b -> b) -> TypeDeclSpecifier -> TypeDeclSpecifier

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

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

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

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

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

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

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

Read TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Syntax.Types

Show TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> TypeDeclSpecifier -> ShowS

show :: TypeDeclSpecifier -> String

showList :: [TypeDeclSpecifier] -> ShowS

Generic TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep TypeDeclSpecifier :: Type -> Type

Pretty TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Pretty

type Rep TypeDeclSpecifier Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep TypeDeclSpecifier = D1 ('MetaData "TypeDeclSpecifier" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "TypeDeclSpecifier" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassType)) :+: (C1 ('MetaCons "TypeDeclSpecifierWithDiamond" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ClassType) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Diamond))) :+: C1 ('MetaCons "TypeDeclSpecifierUnqualifiedWithDiamond" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Diamond))))

data Diamond Source #

Constructors

Diamond 

Instances

Instances details
Eq Diamond Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: Diamond -> Diamond -> Bool

(/=) :: Diamond -> Diamond -> Bool

Data Diamond Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: Diamond -> Constr

dataTypeOf :: Diamond -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Diamond)

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

gmapT :: (forall b. Data b => b -> b) -> Diamond -> Diamond

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

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

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

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

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

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

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

Read Diamond Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS Diamond

readList :: ReadS [Diamond]

readPrec :: ReadPrec Diamond

readListPrec :: ReadPrec [Diamond]

Show Diamond Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> Diamond -> ShowS

show :: Diamond -> String

showList :: [Diamond] -> ShowS

Generic Diamond Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep Diamond :: Type -> Type

Methods

from :: Diamond -> Rep Diamond x

to :: Rep Diamond x -> Diamond

Pretty Diamond Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Diamond -> Doc Source #

prettyPrec :: Int -> Diamond -> Doc Source #

type Rep Diamond Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep Diamond = D1 ('MetaData "Diamond" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "Diamond" 'PrefixI 'False) (U1 :: Type -> Type))

data WildcardBound Source #

Wildcards may be given explicit bounds, either upper (extends) or lower (super) bounds.

Instances

Instances details
Eq WildcardBound Source # 
Instance details

Defined in Language.Java.Syntax.Types

Data WildcardBound Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: WildcardBound -> Constr

dataTypeOf :: WildcardBound -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WildcardBound)

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

gmapT :: (forall b. Data b => b -> b) -> WildcardBound -> WildcardBound

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

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

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

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

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

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

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

Read WildcardBound Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS WildcardBound

readList :: ReadS [WildcardBound]

readPrec :: ReadPrec WildcardBound

readListPrec :: ReadPrec [WildcardBound]

Show WildcardBound Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> WildcardBound -> ShowS

show :: WildcardBound -> String

showList :: [WildcardBound] -> ShowS

Generic WildcardBound Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep WildcardBound :: Type -> Type

Pretty WildcardBound Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: WildcardBound -> Doc Source #

prettyPrec :: Int -> WildcardBound -> Doc Source #

type Rep WildcardBound Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep WildcardBound = D1 ('MetaData "WildcardBound" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "ExtendsBound" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefType)) :+: C1 ('MetaCons "SuperBound" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefType)))

data PrimType Source #

A primitive type is predefined by the Java programming language and named by its reserved keyword.

Instances

Instances details
Eq PrimType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: PrimType -> PrimType -> Bool

(/=) :: PrimType -> PrimType -> Bool

Data PrimType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: PrimType -> Constr

dataTypeOf :: PrimType -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrimType)

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

gmapT :: (forall b. Data b => b -> b) -> PrimType -> PrimType

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

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

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

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

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

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

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

Read PrimType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS PrimType

readList :: ReadS [PrimType]

readPrec :: ReadPrec PrimType

readListPrec :: ReadPrec [PrimType]

Show PrimType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> PrimType -> ShowS

show :: PrimType -> String

showList :: [PrimType] -> ShowS

Generic PrimType Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep PrimType :: Type -> Type

Methods

from :: PrimType -> Rep PrimType x

to :: Rep PrimType x -> PrimType

Pretty PrimType Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: PrimType -> Doc Source #

prettyPrec :: Int -> PrimType -> Doc Source #

type Rep PrimType Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep PrimType = D1 ('MetaData "PrimType" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (((C1 ('MetaCons "BooleanT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ByteT" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ShortT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IntT" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LongT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CharT" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "FloatT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoubleT" 'PrefixI 'False) (U1 :: Type -> Type))))

data TypeParam Source #

A class is generic if it declares one or more type variables. These type variables are known as the type parameters of the class.

Constructors

TypeParam Ident [RefType] 

Instances

Instances details
Eq TypeParam Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: TypeParam -> TypeParam -> Bool

(/=) :: TypeParam -> TypeParam -> Bool

Data TypeParam Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: TypeParam -> Constr

dataTypeOf :: TypeParam -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeParam)

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

gmapT :: (forall b. Data b => b -> b) -> TypeParam -> TypeParam

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

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

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

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

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

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

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

Read TypeParam Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS TypeParam

readList :: ReadS [TypeParam]

readPrec :: ReadPrec TypeParam

readListPrec :: ReadPrec [TypeParam]

Show TypeParam Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> TypeParam -> ShowS

show :: TypeParam -> String

showList :: [TypeParam] -> ShowS

Generic TypeParam Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep TypeParam :: Type -> Type

Methods

from :: TypeParam -> Rep TypeParam x

to :: Rep TypeParam x -> TypeParam

Pretty TypeParam Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: TypeParam -> Doc Source #

prettyPrec :: Int -> TypeParam -> Doc Source #

type Rep TypeParam Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep TypeParam = D1 ('MetaData "TypeParam" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "TypeParam" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ident) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RefType])))

data Ident Source #

A single identifier.

Constructors

Ident String 

Instances

Instances details
Eq Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: Ident -> Ident -> Bool

(/=) :: Ident -> Ident -> Bool

Data Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: Ident -> Constr

dataTypeOf :: Ident -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ident)

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

gmapT :: (forall b. Data b => b -> b) -> Ident -> Ident

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

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

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

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

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

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

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

Ord Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

compare :: Ident -> Ident -> Ordering

(<) :: Ident -> Ident -> Bool

(<=) :: Ident -> Ident -> Bool

(>) :: Ident -> Ident -> Bool

(>=) :: Ident -> Ident -> Bool

max :: Ident -> Ident -> Ident

min :: Ident -> Ident -> Ident

Read Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS Ident

readList :: ReadS [Ident]

readPrec :: ReadPrec Ident

readListPrec :: ReadPrec [Ident]

Show Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> Ident -> ShowS

show :: Ident -> String

showList :: [Ident] -> ShowS

Generic Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep Ident :: Type -> Type

Methods

from :: Ident -> Rep Ident x

to :: Rep Ident x -> Ident

Pretty Ident Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Ident -> Doc Source #

prettyPrec :: Int -> Ident -> Doc Source #

type Rep Ident Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep Ident = D1 ('MetaData "Ident" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "Ident" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

data Name Source #

A name, i.e. a period-separated list of identifiers.

Constructors

Name [Ident] 

Instances

Instances details
Eq Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

(==) :: Name -> Name -> Bool

(/=) :: Name -> Name -> Bool

Data Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

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

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

toConstr :: Name -> Constr

dataTypeOf :: Name -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name)

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

gmapT :: (forall b. Data b => b -> b) -> Name -> Name

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

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

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

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

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

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

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

Ord Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

compare :: Name -> Name -> Ordering

(<) :: Name -> Name -> Bool

(<=) :: Name -> Name -> Bool

(>) :: Name -> Name -> Bool

(>=) :: Name -> Name -> Bool

max :: Name -> Name -> Name

min :: Name -> Name -> Name

Read Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

readsPrec :: Int -> ReadS Name

readList :: ReadS [Name]

readPrec :: ReadPrec Name

readListPrec :: ReadPrec [Name]

Show Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

Methods

showsPrec :: Int -> Name -> ShowS

show :: Name -> String

showList :: [Name] -> ShowS

Generic Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

Associated Types

type Rep Name :: Type -> Type

Methods

from :: Name -> Rep Name x

to :: Rep Name x -> Name

Pretty Name Source # 
Instance details

Defined in Language.Java.Pretty

Methods

pretty :: Name -> Doc Source #

prettyPrec :: Int -> Name -> Doc Source #

type Rep Name Source # 
Instance details

Defined in Language.Java.Syntax.Types

type Rep Name = D1 ('MetaData "Name" "Language.Java.Syntax.Types" "language-java-0.2.9-LbEKm07srR5INLtQVpnkE4" 'False) (C1 ('MetaCons "Name" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ident])))