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

Safe HaskellNone
LanguageHaskell2010

TreeSitter.Java.AST

Documentation

type AnonymousTilde = Token "~" 52 Source #

type AnonymousRBrace = Token "}" 64 Source #

type AnonymousPipePipe = Token "||" 35 Source #

type AnonymousPipeEqual = Token "|=" 22 Source #

type AnonymousPipe = Token "|" 40 Source #

type AnonymousLBrace = Token "{" 63 Source #

type AnonymousWith = Token "with" 91 Source #

type AnonymousWhile = Token "while" 70 Source #

type AnonymousVolatile = Token "volatile" 105 Source #

data VoidType a Source #

Constructors

VoidType 

Fields

Instances
Functor VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> VoidType a -> VoidType b #

(<$) :: a -> VoidType b -> VoidType a #

Foldable VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => VoidType m -> m #

foldMap :: Monoid m => (a -> m) -> VoidType a -> m #

foldr :: (a -> b -> b) -> b -> VoidType a -> b #

foldr' :: (a -> b -> b) -> b -> VoidType a -> b #

foldl :: (b -> a -> b) -> b -> VoidType a -> b #

foldl' :: (b -> a -> b) -> b -> VoidType a -> b #

foldr1 :: (a -> a -> a) -> VoidType a -> a #

foldl1 :: (a -> a -> a) -> VoidType a -> a #

toList :: VoidType a -> [a] #

null :: VoidType a -> Bool #

length :: VoidType a -> Int #

elem :: Eq a => a -> VoidType a -> Bool #

maximum :: Ord a => VoidType a -> a #

minimum :: Ord a => VoidType a -> a #

sum :: Num a => VoidType a -> a #

product :: Num a => VoidType a -> a #

Traversable VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> VoidType a -> f (VoidType b) #

sequenceA :: Applicative f => VoidType (f a) -> f (VoidType a) #

mapM :: Monad m => (a -> m b) -> VoidType a -> m (VoidType b) #

sequence :: Monad m => VoidType (m a) -> m (VoidType a) #

SymbolMatching VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy VoidType -> Node -> Bool

showFailure :: Proxy VoidType -> Node -> String

Unmarshal VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (VoidType a)

Eq a => Eq (VoidType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: VoidType a -> VoidType a -> Bool #

(/=) :: VoidType a -> VoidType a -> Bool #

Ord a => Ord (VoidType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: VoidType a -> VoidType a -> Ordering #

(<) :: VoidType a -> VoidType a -> Bool #

(<=) :: VoidType a -> VoidType a -> Bool #

(>) :: VoidType a -> VoidType a -> Bool #

(>=) :: VoidType a -> VoidType a -> Bool #

max :: VoidType a -> VoidType a -> VoidType a #

min :: VoidType a -> VoidType a -> VoidType a #

Show a => Show (VoidType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> VoidType a -> ShowS #

show :: VoidType a -> String #

showList :: [VoidType a] -> ShowS #

Generic (VoidType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (VoidType a) :: Type -> Type #

Methods

from :: VoidType a -> Rep (VoidType a) x #

to :: Rep (VoidType a) x -> VoidType a #

Generic1 VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 VoidType :: k -> Type #

Methods

from1 :: VoidType a -> Rep1 VoidType a #

to1 :: Rep1 VoidType a -> VoidType a #

type Rep (VoidType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (VoidType a) = D1 (MetaData "VoidType" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "VoidType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 VoidType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 VoidType = D1 (MetaData "VoidType" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "VoidType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousUses = Token "uses" 89 Source #

data TypeIdentifier a Source #

Constructors

TypeIdentifier 

Fields

Instances
Functor TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> TypeIdentifier a -> TypeIdentifier b #

(<$) :: a -> TypeIdentifier b -> TypeIdentifier a #

Foldable TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TypeIdentifier m -> m #

foldMap :: Monoid m => (a -> m) -> TypeIdentifier a -> m #

foldr :: (a -> b -> b) -> b -> TypeIdentifier a -> b #

foldr' :: (a -> b -> b) -> b -> TypeIdentifier a -> b #

foldl :: (b -> a -> b) -> b -> TypeIdentifier a -> b #

foldl' :: (b -> a -> b) -> b -> TypeIdentifier a -> b #

foldr1 :: (a -> a -> a) -> TypeIdentifier a -> a #

foldl1 :: (a -> a -> a) -> TypeIdentifier a -> a #

toList :: TypeIdentifier a -> [a] #

null :: TypeIdentifier a -> Bool #

length :: TypeIdentifier a -> Int #

elem :: Eq a => a -> TypeIdentifier a -> Bool #

maximum :: Ord a => TypeIdentifier a -> a #

minimum :: Ord a => TypeIdentifier a -> a #

sum :: Num a => TypeIdentifier a -> a #

product :: Num a => TypeIdentifier a -> a #

Traversable TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TypeIdentifier a -> f (TypeIdentifier b) #

sequenceA :: Applicative f => TypeIdentifier (f a) -> f (TypeIdentifier a) #

mapM :: Monad m => (a -> m b) -> TypeIdentifier a -> m (TypeIdentifier b) #

sequence :: Monad m => TypeIdentifier (m a) -> m (TypeIdentifier a) #

SymbolMatching TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeIdentifier a)

Eq a => Eq (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TypeIdentifier a) :: Type -> Type #

Generic1 TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TypeIdentifier :: k -> Type #

type Rep (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TypeIdentifier a) = D1 (MetaData "TypeIdentifier" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeIdentifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 TypeIdentifier = D1 (MetaData "TypeIdentifier" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeIdentifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousTry = Token "try" 76 Source #

data True a Source #

Constructors

True 

Fields

Instances
Functor True Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> True a -> True b #

(<$) :: a -> True b -> True a #

Foldable True Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => True m -> m #

foldMap :: Monoid m => (a -> m) -> True a -> m #

foldr :: (a -> b -> b) -> b -> True a -> b #

foldr' :: (a -> b -> b) -> b -> True a -> b #

foldl :: (b -> a -> b) -> b -> True a -> b #

foldl' :: (b -> a -> b) -> b -> True a -> b #

foldr1 :: (a -> a -> a) -> True a -> a #

foldl1 :: (a -> a -> a) -> True a -> a #

toList :: True a -> [a] #

null :: True a -> Bool #

length :: True a -> Int #

elem :: Eq a => a -> True a -> Bool #

maximum :: Ord a => True a -> a #

minimum :: Ord a => True a -> a #

sum :: Num a => True a -> a #

product :: Num a => True a -> a #

Traversable True Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> True a -> f (True b) #

sequenceA :: Applicative f => True (f a) -> f (True a) #

mapM :: Monad m => (a -> m b) -> True a -> m (True b) #

sequence :: Monad m => True (m a) -> m (True a) #

SymbolMatching True Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy True -> Node -> Bool

showFailure :: Proxy True -> Node -> String

Unmarshal True Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (True a)

Eq a => Eq (True a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: True a -> True a -> Bool #

(/=) :: True a -> True a -> Bool #

Ord a => Ord (True a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: True a -> True a -> Ordering #

(<) :: True a -> True a -> Bool #

(<=) :: True a -> True a -> Bool #

(>) :: True a -> True a -> Bool #

(>=) :: True a -> True a -> Bool #

max :: True a -> True a -> True a #

min :: True a -> True a -> True a #

Show a => Show (True a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> True a -> ShowS #

show :: True a -> String #

showList :: [True a] -> ShowS #

Generic (True a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (True a) :: Type -> Type #

Methods

from :: True a -> Rep (True a) x #

to :: Rep (True a) x -> True a #

Generic1 True Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 True :: k -> Type #

Methods

from1 :: True a -> Rep1 True a #

to1 :: Rep1 True a -> True a #

type Rep (True a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (True a) = D1 (MetaData "True" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "True" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 True Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 True = D1 (MetaData "True" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "True" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousTransitive = Token "transitive" 92 Source #

type AnonymousTransient = Token "transient" 104 Source #

type AnonymousTo = Token "to" 87 Source #

type AnonymousThrows = Token "throws" 119 Source #

type AnonymousThrow = Token "throw" 75 Source #

data This a Source #

Constructors

This 

Fields

Instances
Functor This Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> This a -> This b #

(<$) :: a -> This b -> This a #

Foldable This Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => This m -> m #

foldMap :: Monoid m => (a -> m) -> This a -> m #

foldr :: (a -> b -> b) -> b -> This a -> b #

foldr' :: (a -> b -> b) -> b -> This a -> b #

foldl :: (b -> a -> b) -> b -> This a -> b #

foldl' :: (b -> a -> b) -> b -> This a -> b #

foldr1 :: (a -> a -> a) -> This a -> a #

foldl1 :: (a -> a -> a) -> This a -> a #

toList :: This a -> [a] #

null :: This a -> Bool #

length :: This a -> Int #

elem :: Eq a => a -> This a -> Bool #

maximum :: Ord a => This a -> a #

minimum :: Ord a => This a -> a #

sum :: Num a => This a -> a #

product :: Num a => This a -> a #

Traversable This Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> This a -> f (This b) #

sequenceA :: Applicative f => This (f a) -> f (This a) #

mapM :: Monad m => (a -> m b) -> This a -> m (This b) #

sequence :: Monad m => This (m a) -> m (This a) #

SymbolMatching This Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy This -> Node -> Bool

showFailure :: Proxy This -> Node -> String

Unmarshal This Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (This a)

Eq a => Eq (This a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: This a -> This a -> Bool #

(/=) :: This a -> This a -> Bool #

Ord a => Ord (This a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: This a -> This a -> Ordering #

(<) :: This a -> This a -> Bool #

(<=) :: This a -> This a -> Bool #

(>) :: This a -> This a -> Bool #

(>=) :: This a -> This a -> Bool #

max :: This a -> This a -> This a #

min :: This a -> This a -> This a #

Show a => Show (This a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> This a -> ShowS #

show :: This a -> String #

showList :: [This a] -> ShowS #

Generic (This a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (This a) :: Type -> Type #

Methods

from :: This a -> Rep (This a) x #

to :: Rep (This a) x -> This a #

Generic1 This Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 This :: k -> Type #

Methods

from1 :: This a -> Rep1 This a #

to1 :: Rep1 This a -> This a #

type Rep (This a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (This a) = D1 (MetaData "This" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "This" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 This Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 This = D1 (MetaData "This" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "This" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousSynchronized = Token "synchronized" 74 Source #

type AnonymousSwitch = Token "switch" 66 Source #

data Super a Source #

Constructors

Super 

Fields

Instances
Functor Super Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Super a -> Super b #

(<$) :: a -> Super b -> Super a #

Foldable Super Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Super m -> m #

foldMap :: Monoid m => (a -> m) -> Super a -> m #

foldr :: (a -> b -> b) -> b -> Super a -> b #

foldr' :: (a -> b -> b) -> b -> Super a -> b #

foldl :: (b -> a -> b) -> b -> Super a -> b #

foldl' :: (b -> a -> b) -> b -> Super a -> b #

foldr1 :: (a -> a -> a) -> Super a -> a #

foldl1 :: (a -> a -> a) -> Super a -> a #

toList :: Super a -> [a] #

null :: Super a -> Bool #

length :: Super a -> Int #

elem :: Eq a => a -> Super a -> Bool #

maximum :: Ord a => Super a -> a #

minimum :: Ord a => Super a -> a #

sum :: Num a => Super a -> a #

product :: Num a => Super a -> a #

Traversable Super Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Super a -> f (Super b) #

sequenceA :: Applicative f => Super (f a) -> f (Super a) #

mapM :: Monad m => (a -> m b) -> Super a -> m (Super b) #

sequence :: Monad m => Super (m a) -> m (Super a) #

SymbolMatching Super Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Super -> Node -> Bool

showFailure :: Proxy Super -> Node -> String

Unmarshal Super Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Super a)

Eq a => Eq (Super a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Super a -> Super a -> Bool #

(/=) :: Super a -> Super a -> Bool #

Ord a => Ord (Super a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Super a -> Super a -> Ordering #

(<) :: Super a -> Super a -> Bool #

(<=) :: Super a -> Super a -> Bool #

(>) :: Super a -> Super a -> Bool #

(>=) :: Super a -> Super a -> Bool #

max :: Super a -> Super a -> Super a #

min :: Super a -> Super a -> Super a #

Show a => Show (Super a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Super a -> ShowS #

show :: Super a -> String #

showList :: [Super a] -> ShowS #

Generic (Super a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Super a) :: Type -> Type #

Methods

from :: Super a -> Rep (Super a) x #

to :: Rep (Super a) x -> Super a #

Generic1 Super Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Super :: k -> Type #

Methods

from1 :: Super a -> Rep1 Super a #

to1 :: Rep1 Super a -> Super a #

type Rep (Super a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Super a) = D1 (MetaData "Super" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Super" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 Super Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Super = D1 (MetaData "Super" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Super" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data StringLiteral a Source #

Constructors

StringLiteral 

Fields

Instances
Functor StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> StringLiteral a -> StringLiteral b #

(<$) :: a -> StringLiteral b -> StringLiteral a #

Foldable StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => StringLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> StringLiteral a -> m #

foldr :: (a -> b -> b) -> b -> StringLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> StringLiteral a -> b #

foldl :: (b -> a -> b) -> b -> StringLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> StringLiteral a -> b #

foldr1 :: (a -> a -> a) -> StringLiteral a -> a #

foldl1 :: (a -> a -> a) -> StringLiteral a -> a #

toList :: StringLiteral a -> [a] #

null :: StringLiteral a -> Bool #

length :: StringLiteral a -> Int #

elem :: Eq a => a -> StringLiteral a -> Bool #

maximum :: Ord a => StringLiteral a -> a #

minimum :: Ord a => StringLiteral a -> a #

sum :: Num a => StringLiteral a -> a #

product :: Num a => StringLiteral a -> a #

Traversable StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> StringLiteral a -> f (StringLiteral b) #

sequenceA :: Applicative f => StringLiteral (f a) -> f (StringLiteral a) #

mapM :: Monad m => (a -> m b) -> StringLiteral a -> m (StringLiteral b) #

sequence :: Monad m => StringLiteral (m a) -> m (StringLiteral a) #

SymbolMatching StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (StringLiteral a)

Eq a => Eq (StringLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (StringLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (StringLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (StringLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (StringLiteral a) :: Type -> Type #

Generic1 StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 StringLiteral :: k -> Type #

type Rep (StringLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (StringLiteral a) = D1 (MetaData "StringLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "StringLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 StringLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 StringLiteral = D1 (MetaData "StringLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "StringLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousStrictfp = Token "strictfp" 102 Source #

type AnonymousStatic = Token "static" 93 Source #

type AnonymousShort = Token "short" 110 Source #

type AnonymousReturn = Token "return" 73 Source #

type AnonymousRequires = Token "requires" 85 Source #

type AnonymousPublic = Token "public" 97 Source #

type AnonymousProvides = Token "provides" 90 Source #

type AnonymousProtected = Token "protected" 98 Source #

type AnonymousPrivate = Token "private" 99 Source #

type AnonymousPackage = Token "package" 94 Source #

type AnonymousOpens = Token "opens" 88 Source #

type AnonymousOpen = Token "open" 83 Source #

data OctalIntegerLiteral a Source #

Constructors

OctalIntegerLiteral 

Fields

Instances
Functor OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => OctalIntegerLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> OctalIntegerLiteral a -> m #

foldr :: (a -> b -> b) -> b -> OctalIntegerLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> OctalIntegerLiteral a -> b #

foldl :: (b -> a -> b) -> b -> OctalIntegerLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> OctalIntegerLiteral a -> b #

foldr1 :: (a -> a -> a) -> OctalIntegerLiteral a -> a #

foldl1 :: (a -> a -> a) -> OctalIntegerLiteral a -> a #

toList :: OctalIntegerLiteral a -> [a] #

null :: OctalIntegerLiteral a -> Bool #

length :: OctalIntegerLiteral a -> Int #

elem :: Eq a => a -> OctalIntegerLiteral a -> Bool #

maximum :: Ord a => OctalIntegerLiteral a -> a #

minimum :: Ord a => OctalIntegerLiteral a -> a #

sum :: Num a => OctalIntegerLiteral a -> a #

product :: Num a => OctalIntegerLiteral a -> a #

Traversable OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (OctalIntegerLiteral a)

Eq a => Eq (OctalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (OctalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (OctalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (OctalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (OctalIntegerLiteral a) :: Type -> Type #

Generic1 OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 OctalIntegerLiteral :: k -> Type #

type Rep (OctalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (OctalIntegerLiteral a) = D1 (MetaData "OctalIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "OctalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 OctalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 OctalIntegerLiteral = D1 (MetaData "OctalIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "OctalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data NullLiteral a Source #

Constructors

NullLiteral 

Fields

Instances
Functor NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> NullLiteral a -> NullLiteral b #

(<$) :: a -> NullLiteral b -> NullLiteral a #

Foldable NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => NullLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> NullLiteral a -> m #

foldr :: (a -> b -> b) -> b -> NullLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> NullLiteral a -> b #

foldl :: (b -> a -> b) -> b -> NullLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> NullLiteral a -> b #

foldr1 :: (a -> a -> a) -> NullLiteral a -> a #

foldl1 :: (a -> a -> a) -> NullLiteral a -> a #

toList :: NullLiteral a -> [a] #

null :: NullLiteral a -> Bool #

length :: NullLiteral a -> Int #

elem :: Eq a => a -> NullLiteral a -> Bool #

maximum :: Ord a => NullLiteral a -> a #

minimum :: Ord a => NullLiteral a -> a #

sum :: Num a => NullLiteral a -> a #

product :: Num a => NullLiteral a -> a #

Traversable NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> NullLiteral a -> f (NullLiteral b) #

sequenceA :: Applicative f => NullLiteral (f a) -> f (NullLiteral a) #

mapM :: Monad m => (a -> m b) -> NullLiteral a -> m (NullLiteral b) #

sequence :: Monad m => NullLiteral (m a) -> m (NullLiteral a) #

SymbolMatching NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (NullLiteral a)

Eq a => Eq (NullLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (NullLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (NullLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (NullLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (NullLiteral a) :: Type -> Type #

Methods

from :: NullLiteral a -> Rep (NullLiteral a) x #

to :: Rep (NullLiteral a) x -> NullLiteral a #

Generic1 NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 NullLiteral :: k -> Type #

type Rep (NullLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (NullLiteral a) = D1 (MetaData "NullLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "NullLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 NullLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 NullLiteral = D1 (MetaData "NullLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "NullLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousNew = Token "new" 55 Source #

type AnonymousNative = Token "native" 103 Source #

type AnonymousModule = Token "module" 84 Source #

type AnonymousLong = Token "long" 112 Source #

type AnonymousInterface = Token "interface" 108 Source #

type AnonymousInt = Token "int" 111 Source #

type AnonymousInstanceof = Token "instanceof" 46 Source #

type AnonymousImport = Token "import" 95 Source #

type AnonymousImplements = Token "implements" 106 Source #

type AnonymousIf = Token "if" 79 Source #

data Identifier a Source #

Constructors

Identifier 

Fields

Instances
Functor Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Identifier a -> Identifier b #

(<$) :: a -> Identifier b -> Identifier a #

Foldable Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Identifier m -> m #

foldMap :: Monoid m => (a -> m) -> Identifier a -> m #

foldr :: (a -> b -> b) -> b -> Identifier a -> b #

foldr' :: (a -> b -> b) -> b -> Identifier a -> b #

foldl :: (b -> a -> b) -> b -> Identifier a -> b #

foldl' :: (b -> a -> b) -> b -> Identifier a -> b #

foldr1 :: (a -> a -> a) -> Identifier a -> a #

foldl1 :: (a -> a -> a) -> Identifier a -> a #

toList :: Identifier a -> [a] #

null :: Identifier a -> Bool #

length :: Identifier a -> Int #

elem :: Eq a => a -> Identifier a -> Bool #

maximum :: Ord a => Identifier a -> a #

minimum :: Ord a => Identifier a -> a #

sum :: Num a => Identifier a -> a #

product :: Num a => Identifier a -> a #

Traversable Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Identifier a -> f (Identifier b) #

sequenceA :: Applicative f => Identifier (f a) -> f (Identifier a) #

mapM :: Monad m => (a -> m b) -> Identifier a -> m (Identifier b) #

sequence :: Monad m => Identifier (m a) -> m (Identifier a) #

SymbolMatching Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Identifier a)

Eq a => Eq (Identifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Identifier a -> Identifier a -> Bool #

(/=) :: Identifier a -> Identifier a -> Bool #

Ord a => Ord (Identifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (Identifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (Identifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Identifier a) :: Type -> Type #

Methods

from :: Identifier a -> Rep (Identifier a) x #

to :: Rep (Identifier a) x -> Identifier a #

Generic1 Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Identifier :: k -> Type #

type Rep (Identifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Identifier a) = D1 (MetaData "Identifier" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Identifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 Identifier Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Identifier = D1 (MetaData "Identifier" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Identifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data HexIntegerLiteral a Source #

Constructors

HexIntegerLiteral 

Fields

Instances
Functor HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => HexIntegerLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> HexIntegerLiteral a -> m #

foldr :: (a -> b -> b) -> b -> HexIntegerLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> HexIntegerLiteral a -> b #

foldl :: (b -> a -> b) -> b -> HexIntegerLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> HexIntegerLiteral a -> b #

foldr1 :: (a -> a -> a) -> HexIntegerLiteral a -> a #

foldl1 :: (a -> a -> a) -> HexIntegerLiteral a -> a #

toList :: HexIntegerLiteral a -> [a] #

null :: HexIntegerLiteral a -> Bool #

length :: HexIntegerLiteral a -> Int #

elem :: Eq a => a -> HexIntegerLiteral a -> Bool #

maximum :: Ord a => HexIntegerLiteral a -> a #

minimum :: Ord a => HexIntegerLiteral a -> a #

sum :: Num a => HexIntegerLiteral a -> a #

product :: Num a => HexIntegerLiteral a -> a #

Traversable HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> HexIntegerLiteral a -> f (HexIntegerLiteral b) #

sequenceA :: Applicative f => HexIntegerLiteral (f a) -> f (HexIntegerLiteral a) #

mapM :: Monad m => (a -> m b) -> HexIntegerLiteral a -> m (HexIntegerLiteral b) #

sequence :: Monad m => HexIntegerLiteral (m a) -> m (HexIntegerLiteral a) #

SymbolMatching HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (HexIntegerLiteral a)

Eq a => Eq (HexIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (HexIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (HexIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (HexIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (HexIntegerLiteral a) :: Type -> Type #

Generic1 HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 HexIntegerLiteral :: k -> Type #

type Rep (HexIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (HexIntegerLiteral a) = D1 (MetaData "HexIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "HexIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 HexIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 HexIntegerLiteral = D1 (MetaData "HexIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "HexIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data HexFloatingPointLiteral a Source #

Constructors

HexFloatingPointLiteral 

Fields

Instances
Functor HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => HexFloatingPointLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> HexFloatingPointLiteral a -> m #

foldr :: (a -> b -> b) -> b -> HexFloatingPointLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> HexFloatingPointLiteral a -> b #

foldl :: (b -> a -> b) -> b -> HexFloatingPointLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> HexFloatingPointLiteral a -> b #

foldr1 :: (a -> a -> a) -> HexFloatingPointLiteral a -> a #

foldl1 :: (a -> a -> a) -> HexFloatingPointLiteral a -> a #

toList :: HexFloatingPointLiteral a -> [a] #

null :: HexFloatingPointLiteral a -> Bool #

length :: HexFloatingPointLiteral a -> Int #

elem :: Eq a => a -> HexFloatingPointLiteral a -> Bool #

maximum :: Ord a => HexFloatingPointLiteral a -> a #

minimum :: Ord a => HexFloatingPointLiteral a -> a #

sum :: Num a => HexFloatingPointLiteral a -> a #

product :: Num a => HexFloatingPointLiteral a -> a #

Traversable HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (HexFloatingPointLiteral a)

Eq a => Eq (HexFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (HexFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (HexFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (HexFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (HexFloatingPointLiteral a) :: Type -> Type #

Generic1 HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 HexFloatingPointLiteral :: k -> Type #

type Rep (HexFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (HexFloatingPointLiteral a) = D1 (MetaData "HexFloatingPointLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "HexFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 HexFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 HexFloatingPointLiteral = D1 (MetaData "HexFloatingPointLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "HexFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousFor = Token "for" 81 Source #

type AnonymousFloat = Token "float" 114 Source #

type AnonymousFinally = Token "finally" 78 Source #

type AnonymousFinal = Token "final" 101 Source #

data False a Source #

Constructors

False 

Fields

Instances
Functor False Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> False a -> False b #

(<$) :: a -> False b -> False a #

Foldable False Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => False m -> m #

foldMap :: Monoid m => (a -> m) -> False a -> m #

foldr :: (a -> b -> b) -> b -> False a -> b #

foldr' :: (a -> b -> b) -> b -> False a -> b #

foldl :: (b -> a -> b) -> b -> False a -> b #

foldl' :: (b -> a -> b) -> b -> False a -> b #

foldr1 :: (a -> a -> a) -> False a -> a #

foldl1 :: (a -> a -> a) -> False a -> a #

toList :: False a -> [a] #

null :: False a -> Bool #

length :: False a -> Int #

elem :: Eq a => a -> False a -> Bool #

maximum :: Ord a => False a -> a #

minimum :: Ord a => False a -> a #

sum :: Num a => False a -> a #

product :: Num a => False a -> a #

Traversable False Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> False a -> f (False b) #

sequenceA :: Applicative f => False (f a) -> f (False a) #

mapM :: Monad m => (a -> m b) -> False a -> m (False b) #

sequence :: Monad m => False (m a) -> m (False a) #

SymbolMatching False Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy False -> Node -> Bool

showFailure :: Proxy False -> Node -> String

Unmarshal False Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (False a)

Eq a => Eq (False a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: False a -> False a -> Bool #

(/=) :: False a -> False a -> Bool #

Ord a => Ord (False a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: False a -> False a -> Ordering #

(<) :: False a -> False a -> Bool #

(<=) :: False a -> False a -> Bool #

(>) :: False a -> False a -> Bool #

(>=) :: False a -> False a -> Bool #

max :: False a -> False a -> False a #

min :: False a -> False a -> False a #

Show a => Show (False a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> False a -> ShowS #

show :: False a -> String #

showList :: [False a] -> ShowS #

Generic (False a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (False a) :: Type -> Type #

Methods

from :: False a -> Rep (False a) x #

to :: Rep (False a) x -> False a #

Generic1 False Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 False :: k -> Type #

Methods

from1 :: False a -> Rep1 False a #

to1 :: Rep1 False a -> False a #

type Rep (False a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (False a) = D1 (MetaData "False" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "False" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 False Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 False = D1 (MetaData "False" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "False" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousExtends = Token "extends" 61 Source #

type AnonymousExports = Token "exports" 86 Source #

type AnonymousEnum = Token "enum" 96 Source #

type AnonymousElse = Token "else" 80 Source #

type AnonymousDouble = Token "double" 115 Source #

type AnonymousDo = Token "do" 69 Source #

type AnonymousDefault = Token "default" 68 Source #

data DecimalIntegerLiteral a Source #

Constructors

DecimalIntegerLiteral 

Fields

Instances
Functor DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => DecimalIntegerLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> DecimalIntegerLiteral a -> m #

foldr :: (a -> b -> b) -> b -> DecimalIntegerLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> DecimalIntegerLiteral a -> b #

foldl :: (b -> a -> b) -> b -> DecimalIntegerLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> DecimalIntegerLiteral a -> b #

foldr1 :: (a -> a -> a) -> DecimalIntegerLiteral a -> a #

foldl1 :: (a -> a -> a) -> DecimalIntegerLiteral a -> a #

toList :: DecimalIntegerLiteral a -> [a] #

null :: DecimalIntegerLiteral a -> Bool #

length :: DecimalIntegerLiteral a -> Int #

elem :: Eq a => a -> DecimalIntegerLiteral a -> Bool #

maximum :: Ord a => DecimalIntegerLiteral a -> a #

minimum :: Ord a => DecimalIntegerLiteral a -> a #

sum :: Num a => DecimalIntegerLiteral a -> a #

product :: Num a => DecimalIntegerLiteral a -> a #

Traversable DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (DecimalIntegerLiteral a)

Eq a => Eq (DecimalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (DecimalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (DecimalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (DecimalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (DecimalIntegerLiteral a) :: Type -> Type #

Generic1 DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 DecimalIntegerLiteral :: k -> Type #

type Rep (DecimalIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (DecimalIntegerLiteral a) = D1 (MetaData "DecimalIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "DecimalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 DecimalIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 DecimalIntegerLiteral = D1 (MetaData "DecimalIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "DecimalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data DecimalFloatingPointLiteral a Source #

Constructors

DecimalFloatingPointLiteral 

Fields

Instances
Functor DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (DecimalFloatingPointLiteral a)

Eq a => Eq (DecimalFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (DecimalFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (DecimalFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (DecimalFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (DecimalFloatingPointLiteral a) :: Type -> Type #

Generic1 DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 DecimalFloatingPointLiteral :: k -> Type #

type Rep (DecimalFloatingPointLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (DecimalFloatingPointLiteral a) = D1 (MetaData "DecimalFloatingPointLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "DecimalFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 DecimalFloatingPointLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 DecimalFloatingPointLiteral = D1 (MetaData "DecimalFloatingPointLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "DecimalFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousContinue = Token "continue" 72 Source #

type AnonymousClass = Token "class" 59 Source #

data CharacterLiteral a Source #

Constructors

CharacterLiteral 

Fields

Instances
Functor CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> CharacterLiteral a -> CharacterLiteral b #

(<$) :: a -> CharacterLiteral b -> CharacterLiteral a #

Foldable CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => CharacterLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> CharacterLiteral a -> m #

foldr :: (a -> b -> b) -> b -> CharacterLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> CharacterLiteral a -> b #

foldl :: (b -> a -> b) -> b -> CharacterLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> CharacterLiteral a -> b #

foldr1 :: (a -> a -> a) -> CharacterLiteral a -> a #

foldl1 :: (a -> a -> a) -> CharacterLiteral a -> a #

toList :: CharacterLiteral a -> [a] #

null :: CharacterLiteral a -> Bool #

length :: CharacterLiteral a -> Int #

elem :: Eq a => a -> CharacterLiteral a -> Bool #

maximum :: Ord a => CharacterLiteral a -> a #

minimum :: Ord a => CharacterLiteral a -> a #

sum :: Num a => CharacterLiteral a -> a #

product :: Num a => CharacterLiteral a -> a #

Traversable CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> CharacterLiteral a -> f (CharacterLiteral b) #

sequenceA :: Applicative f => CharacterLiteral (f a) -> f (CharacterLiteral a) #

mapM :: Monad m => (a -> m b) -> CharacterLiteral a -> m (CharacterLiteral b) #

sequence :: Monad m => CharacterLiteral (m a) -> m (CharacterLiteral a) #

SymbolMatching CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (CharacterLiteral a)

Eq a => Eq (CharacterLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (CharacterLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (CharacterLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (CharacterLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (CharacterLiteral a) :: Type -> Type #

Generic1 CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 CharacterLiteral :: k -> Type #

type Rep (CharacterLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (CharacterLiteral a) = D1 (MetaData "CharacterLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "CharacterLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 CharacterLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 CharacterLiteral = D1 (MetaData "CharacterLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "CharacterLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousChar = Token "char" 113 Source #

type AnonymousCatch = Token "catch" 77 Source #

type AnonymousCase = Token "case" 67 Source #

type AnonymousByte = Token "byte" 109 Source #

type AnonymousBreak = Token "break" 71 Source #

data BooleanType a Source #

Constructors

BooleanType 

Fields

Instances
Functor BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> BooleanType a -> BooleanType b #

(<$) :: a -> BooleanType b -> BooleanType a #

Foldable BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => BooleanType m -> m #

foldMap :: Monoid m => (a -> m) -> BooleanType a -> m #

foldr :: (a -> b -> b) -> b -> BooleanType a -> b #

foldr' :: (a -> b -> b) -> b -> BooleanType a -> b #

foldl :: (b -> a -> b) -> b -> BooleanType a -> b #

foldl' :: (b -> a -> b) -> b -> BooleanType a -> b #

foldr1 :: (a -> a -> a) -> BooleanType a -> a #

foldl1 :: (a -> a -> a) -> BooleanType a -> a #

toList :: BooleanType a -> [a] #

null :: BooleanType a -> Bool #

length :: BooleanType a -> Int #

elem :: Eq a => a -> BooleanType a -> Bool #

maximum :: Ord a => BooleanType a -> a #

minimum :: Ord a => BooleanType a -> a #

sum :: Num a => BooleanType a -> a #

product :: Num a => BooleanType a -> a #

Traversable BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> BooleanType a -> f (BooleanType b) #

sequenceA :: Applicative f => BooleanType (f a) -> f (BooleanType a) #

mapM :: Monad m => (a -> m b) -> BooleanType a -> m (BooleanType b) #

sequence :: Monad m => BooleanType (m a) -> m (BooleanType a) #

SymbolMatching BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (BooleanType a)

Eq a => Eq (BooleanType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (BooleanType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (BooleanType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (BooleanType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (BooleanType a) :: Type -> Type #

Methods

from :: BooleanType a -> Rep (BooleanType a) x #

to :: Rep (BooleanType a) x -> BooleanType a #

Generic1 BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 BooleanType :: k -> Type #

type Rep (BooleanType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (BooleanType a) = D1 (MetaData "BooleanType" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "BooleanType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 BooleanType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 BooleanType = D1 (MetaData "BooleanType" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "BooleanType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data BinaryIntegerLiteral a Source #

Constructors

BinaryIntegerLiteral 

Fields

Instances
Functor BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => BinaryIntegerLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> BinaryIntegerLiteral a -> m #

foldr :: (a -> b -> b) -> b -> BinaryIntegerLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> BinaryIntegerLiteral a -> b #

foldl :: (b -> a -> b) -> b -> BinaryIntegerLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> BinaryIntegerLiteral a -> b #

foldr1 :: (a -> a -> a) -> BinaryIntegerLiteral a -> a #

foldl1 :: (a -> a -> a) -> BinaryIntegerLiteral a -> a #

toList :: BinaryIntegerLiteral a -> [a] #

null :: BinaryIntegerLiteral a -> Bool #

length :: BinaryIntegerLiteral a -> Int #

elem :: Eq a => a -> BinaryIntegerLiteral a -> Bool #

maximum :: Ord a => BinaryIntegerLiteral a -> a #

minimum :: Ord a => BinaryIntegerLiteral a -> a #

sum :: Num a => BinaryIntegerLiteral a -> a #

product :: Num a => BinaryIntegerLiteral a -> a #

Traversable BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (BinaryIntegerLiteral a)

Eq a => Eq (BinaryIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (BinaryIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (BinaryIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (BinaryIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (BinaryIntegerLiteral a) :: Type -> Type #

Generic1 BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 BinaryIntegerLiteral :: k -> Type #

type Rep (BinaryIntegerLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (BinaryIntegerLiteral a) = D1 (MetaData "BinaryIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "BinaryIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 BinaryIntegerLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 BinaryIntegerLiteral = D1 (MetaData "BinaryIntegerLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "BinaryIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

type AnonymousAssert = Token "assert" 65 Source #

type AnonymousAbstract = Token "abstract" 100 Source #

type AnonymousCaretEqual = Token "^=" 23 Source #

type AnonymousCaret = Token "^" 41 Source #

type AnonymousRBracket = Token "]" 57 Source #

type AnonymousLBracket = Token "[" 56 Source #

type AnonymousAtinterface = Token "@interface" 107 Source #

type AnonymousAt = Token "@" 82 Source #

type AnonymousQuestion = Token "?" 49 Source #

type AnonymousRAngleRAngleRAngle = Token ">>>" 45 Source #

type AnonymousRAngleRAngleEqual = Token ">>=" 26 Source #

type AnonymousRAngleRAngle = Token ">>" 44 Source #

type AnonymousRAngleEqual = Token ">=" 31 Source #

type AnonymousRAngle = Token ">" 28 Source #

type AnonymousEqualEqual = Token "==" 30 Source #

type AnonymousEqual = Token "=" 16 Source #

type AnonymousLAngleEqual = Token "<=" 32 Source #

type AnonymousLAngleLAngleEqual = Token "<<=" 25 Source #

type AnonymousLAngleLAngle = Token "<<" 43 Source #

type AnonymousLAngle = Token "<" 29 Source #

type AnonymousSemicolon = Token ";" 62 Source #

type AnonymousColonColon = Token "::" 60 Source #

type AnonymousColon = Token ":" 50 Source #

type AnonymousSlashEqual = Token "/=" 20 Source #

type AnonymousSlash = Token "/" 39 Source #

type AnonymousDotDotDot = Token "..." 118 Source #

type AnonymousDot = Token "." 58 Source #

type AnonymousMinusRAngle = Token "->" 47 Source #

type AnonymousMinusEqual = Token "-=" 18 Source #

type AnonymousMinusMinus = Token "--" 54 Source #

type AnonymousMinus = Token "-" 37 Source #

type AnonymousComma = Token "," 48 Source #

type AnonymousPlusEqual = Token "+=" 17 Source #

type AnonymousPlusPlus = Token "++" 53 Source #

type AnonymousPlus = Token "+" 36 Source #

type AnonymousStarEqual = Token "*=" 19 Source #

type AnonymousStar = Token "*" 38 Source #

type AnonymousRParen = Token ")" 15 Source #

type AnonymousLParen = Token "(" 13 Source #

type AnonymousAmpersandEqual = Token "&=" 21 Source #

type AnonymousAmpersandAmpersand = Token "&&" 34 Source #

type AnonymousAmpersand = Token "&" 14 Source #

type AnonymousPercentEqual = Token "%=" 24 Source #

type AnonymousPercent = Token "%" 42 Source #

type AnonymousBangEqual = Token "!=" 33 Source #

type AnonymousBang = Token "!" 51 Source #

data Wildcard a Source #

Constructors

Wildcard 
Instances
Functor Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Wildcard a -> Wildcard b #

(<$) :: a -> Wildcard b -> Wildcard a #

Foldable Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Wildcard m -> m #

foldMap :: Monoid m => (a -> m) -> Wildcard a -> m #

foldr :: (a -> b -> b) -> b -> Wildcard a -> b #

foldr' :: (a -> b -> b) -> b -> Wildcard a -> b #

foldl :: (b -> a -> b) -> b -> Wildcard a -> b #

foldl' :: (b -> a -> b) -> b -> Wildcard a -> b #

foldr1 :: (a -> a -> a) -> Wildcard a -> a #

foldl1 :: (a -> a -> a) -> Wildcard a -> a #

toList :: Wildcard a -> [a] #

null :: Wildcard a -> Bool #

length :: Wildcard a -> Int #

elem :: Eq a => a -> Wildcard a -> Bool #

maximum :: Ord a => Wildcard a -> a #

minimum :: Ord a => Wildcard a -> a #

sum :: Num a => Wildcard a -> a #

product :: Num a => Wildcard a -> a #

Traversable Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Wildcard a -> f (Wildcard b) #

sequenceA :: Applicative f => Wildcard (f a) -> f (Wildcard a) #

mapM :: Monad m => (a -> m b) -> Wildcard a -> m (Wildcard b) #

sequence :: Monad m => Wildcard (m a) -> m (Wildcard a) #

SymbolMatching Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Wildcard -> Node -> Bool

showFailure :: Proxy Wildcard -> Node -> String

Unmarshal Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Wildcard a)

Eq a => Eq (Wildcard a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Wildcard a -> Wildcard a -> Bool #

(/=) :: Wildcard a -> Wildcard a -> Bool #

Ord a => Ord (Wildcard a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Wildcard a -> Wildcard a -> Ordering #

(<) :: Wildcard a -> Wildcard a -> Bool #

(<=) :: Wildcard a -> Wildcard a -> Bool #

(>) :: Wildcard a -> Wildcard a -> Bool #

(>=) :: Wildcard a -> Wildcard a -> Bool #

max :: Wildcard a -> Wildcard a -> Wildcard a #

min :: Wildcard a -> Wildcard a -> Wildcard a #

Show a => Show (Wildcard a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Wildcard a -> ShowS #

show :: Wildcard a -> String #

showList :: [Wildcard a] -> ShowS #

Generic (Wildcard a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Wildcard a) :: Type -> Type #

Methods

from :: Wildcard a -> Rep (Wildcard a) x #

to :: Rep (Wildcard a) x -> Wildcard a #

Generic1 Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Wildcard :: k -> Type #

Methods

from1 :: Wildcard a -> Rep1 Wildcard a #

to1 :: Rep1 Wildcard a -> Wildcard a #

type Rep (Wildcard a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Wildcard a) = D1 (MetaData "Wildcard" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Wildcard" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [((Type :+: Annotation) :+: (MarkerAnnotation :+: Super)) a])))
type Rep1 Wildcard Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Wildcard = D1 (MetaData "Wildcard" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Wildcard" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 ((Type :+: Annotation) :+: (MarkerAnnotation :+: Super)))))

data WhileStatement a Source #

Constructors

WhileStatement 

Fields

Instances
Functor WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> WhileStatement a -> WhileStatement b #

(<$) :: a -> WhileStatement b -> WhileStatement a #

Foldable WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => WhileStatement m -> m #

foldMap :: Monoid m => (a -> m) -> WhileStatement a -> m #

foldr :: (a -> b -> b) -> b -> WhileStatement a -> b #

foldr' :: (a -> b -> b) -> b -> WhileStatement a -> b #

foldl :: (b -> a -> b) -> b -> WhileStatement a -> b #

foldl' :: (b -> a -> b) -> b -> WhileStatement a -> b #

foldr1 :: (a -> a -> a) -> WhileStatement a -> a #

foldl1 :: (a -> a -> a) -> WhileStatement a -> a #

toList :: WhileStatement a -> [a] #

null :: WhileStatement a -> Bool #

length :: WhileStatement a -> Int #

elem :: Eq a => a -> WhileStatement a -> Bool #

maximum :: Ord a => WhileStatement a -> a #

minimum :: Ord a => WhileStatement a -> a #

sum :: Num a => WhileStatement a -> a #

product :: Num a => WhileStatement a -> a #

Traversable WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> WhileStatement a -> f (WhileStatement b) #

sequenceA :: Applicative f => WhileStatement (f a) -> f (WhileStatement a) #

mapM :: Monad m => (a -> m b) -> WhileStatement a -> m (WhileStatement b) #

sequence :: Monad m => WhileStatement (m a) -> m (WhileStatement a) #

SymbolMatching WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (WhileStatement a)

Eq a => Eq (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (WhileStatement a) :: Type -> Type #

Generic1 WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 WhileStatement :: k -> Type #

type Rep (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (WhileStatement a) = D1 (MetaData "WhileStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "WhileStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: (S1 (MetaSel (Just "body") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Statement a)) :*: S1 (MetaSel (Just "condition") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ParenthesizedExpression a)))))
type Rep1 WhileStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

data VariableDeclarator a Source #

Instances
Functor VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => VariableDeclarator m -> m #

foldMap :: Monoid m => (a -> m) -> VariableDeclarator a -> m #

foldr :: (a -> b -> b) -> b -> VariableDeclarator a -> b #

foldr' :: (a -> b -> b) -> b -> VariableDeclarator a -> b #

foldl :: (b -> a -> b) -> b -> VariableDeclarator a -> b #

foldl' :: (b -> a -> b) -> b -> VariableDeclarator a -> b #

foldr1 :: (a -> a -> a) -> VariableDeclarator a -> a #

foldl1 :: (a -> a -> a) -> VariableDeclarator a -> a #

toList :: VariableDeclarator a -> [a] #

null :: VariableDeclarator a -> Bool #

length :: VariableDeclarator a -> Int #

elem :: Eq a => a -> VariableDeclarator a -> Bool #

maximum :: Ord a => VariableDeclarator a -> a #

minimum :: Ord a => VariableDeclarator a -> a #

sum :: Num a => VariableDeclarator a -> a #

product :: Num a => VariableDeclarator a -> a #

Traversable VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (VariableDeclarator a)

Eq a => Eq (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (VariableDeclarator a) :: Type -> Type #

Generic1 VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 VariableDeclarator :: k -> Type #

type Rep (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 VariableDeclarator Source # 
Instance details

Defined in TreeSitter.Java.AST

data UpdateExpression a Source #

Constructors

UpdateExpression 

Fields

Instances
Functor UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> UpdateExpression a -> UpdateExpression b #

(<$) :: a -> UpdateExpression b -> UpdateExpression a #

Foldable UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => UpdateExpression m -> m #

foldMap :: Monoid m => (a -> m) -> UpdateExpression a -> m #

foldr :: (a -> b -> b) -> b -> UpdateExpression a -> b #

foldr' :: (a -> b -> b) -> b -> UpdateExpression a -> b #

foldl :: (b -> a -> b) -> b -> UpdateExpression a -> b #

foldl' :: (b -> a -> b) -> b -> UpdateExpression a -> b #

foldr1 :: (a -> a -> a) -> UpdateExpression a -> a #

foldl1 :: (a -> a -> a) -> UpdateExpression a -> a #

toList :: UpdateExpression a -> [a] #

null :: UpdateExpression a -> Bool #

length :: UpdateExpression a -> Int #

elem :: Eq a => a -> UpdateExpression a -> Bool #

maximum :: Ord a => UpdateExpression a -> a #

minimum :: Ord a => UpdateExpression a -> a #

sum :: Num a => UpdateExpression a -> a #

product :: Num a => UpdateExpression a -> a #

Traversable UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> UpdateExpression a -> f (UpdateExpression b) #

sequenceA :: Applicative f => UpdateExpression (f a) -> f (UpdateExpression a) #

mapM :: Monad m => (a -> m b) -> UpdateExpression a -> m (UpdateExpression b) #

sequence :: Monad m => UpdateExpression (m a) -> m (UpdateExpression a) #

SymbolMatching UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (UpdateExpression a)

Eq a => Eq (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (UpdateExpression a) :: Type -> Type #

Generic1 UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 UpdateExpression :: k -> Type #

type Rep (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (UpdateExpression a) = D1 (MetaData "UpdateExpression" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "UpdateExpression" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a))))
type Rep1 UpdateExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 UpdateExpression = D1 (MetaData "UpdateExpression" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "UpdateExpression" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Expression)))

data UnaryExpression a Source #

Instances
Functor UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> UnaryExpression a -> UnaryExpression b #

(<$) :: a -> UnaryExpression b -> UnaryExpression a #

Foldable UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => UnaryExpression m -> m #

foldMap :: Monoid m => (a -> m) -> UnaryExpression a -> m #

foldr :: (a -> b -> b) -> b -> UnaryExpression a -> b #

foldr' :: (a -> b -> b) -> b -> UnaryExpression a -> b #

foldl :: (b -> a -> b) -> b -> UnaryExpression a -> b #

foldl' :: (b -> a -> b) -> b -> UnaryExpression a -> b #

foldr1 :: (a -> a -> a) -> UnaryExpression a -> a #

foldl1 :: (a -> a -> a) -> UnaryExpression a -> a #

toList :: UnaryExpression a -> [a] #

null :: UnaryExpression a -> Bool #

length :: UnaryExpression a -> Int #

elem :: Eq a => a -> UnaryExpression a -> Bool #

maximum :: Ord a => UnaryExpression a -> a #

minimum :: Ord a => UnaryExpression a -> a #

sum :: Num a => UnaryExpression a -> a #

product :: Num a => UnaryExpression a -> a #

Traversable UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> UnaryExpression a -> f (UnaryExpression b) #

sequenceA :: Applicative f => UnaryExpression (f a) -> f (UnaryExpression a) #

mapM :: Monad m => (a -> m b) -> UnaryExpression a -> m (UnaryExpression b) #

sequence :: Monad m => UnaryExpression (m a) -> m (UnaryExpression a) #

SymbolMatching UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (UnaryExpression a)

Eq a => Eq (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (UnaryExpression a) :: Type -> Type #

Generic1 UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 UnaryExpression :: k -> Type #

type Rep (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 UnaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data TypeParameters a Source #

Constructors

TypeParameters 

Fields

Instances
Functor TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> TypeParameters a -> TypeParameters b #

(<$) :: a -> TypeParameters b -> TypeParameters a #

Foldable TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TypeParameters m -> m #

foldMap :: Monoid m => (a -> m) -> TypeParameters a -> m #

foldr :: (a -> b -> b) -> b -> TypeParameters a -> b #

foldr' :: (a -> b -> b) -> b -> TypeParameters a -> b #

foldl :: (b -> a -> b) -> b -> TypeParameters a -> b #

foldl' :: (b -> a -> b) -> b -> TypeParameters a -> b #

foldr1 :: (a -> a -> a) -> TypeParameters a -> a #

foldl1 :: (a -> a -> a) -> TypeParameters a -> a #

toList :: TypeParameters a -> [a] #

null :: TypeParameters a -> Bool #

length :: TypeParameters a -> Int #

elem :: Eq a => a -> TypeParameters a -> Bool #

maximum :: Ord a => TypeParameters a -> a #

minimum :: Ord a => TypeParameters a -> a #

sum :: Num a => TypeParameters a -> a #

product :: Num a => TypeParameters a -> a #

Traversable TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TypeParameters a -> f (TypeParameters b) #

sequenceA :: Applicative f => TypeParameters (f a) -> f (TypeParameters a) #

mapM :: Monad m => (a -> m b) -> TypeParameters a -> m (TypeParameters b) #

sequence :: Monad m => TypeParameters (m a) -> m (TypeParameters a) #

SymbolMatching TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeParameters a)

Eq a => Eq (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TypeParameters a) :: Type -> Type #

Generic1 TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TypeParameters :: k -> Type #

type Rep (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TypeParameters a) = D1 (MetaData "TypeParameters" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeParameters" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (TypeParameter a)))))
type Rep1 TypeParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 TypeParameters = D1 (MetaData "TypeParameters" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeParameters" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 TypeParameter)))

data TypeParameter a Source #

Instances
Functor TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> TypeParameter a -> TypeParameter b #

(<$) :: a -> TypeParameter b -> TypeParameter a #

Foldable TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TypeParameter m -> m #

foldMap :: Monoid m => (a -> m) -> TypeParameter a -> m #

foldr :: (a -> b -> b) -> b -> TypeParameter a -> b #

foldr' :: (a -> b -> b) -> b -> TypeParameter a -> b #

foldl :: (b -> a -> b) -> b -> TypeParameter a -> b #

foldl' :: (b -> a -> b) -> b -> TypeParameter a -> b #

foldr1 :: (a -> a -> a) -> TypeParameter a -> a #

foldl1 :: (a -> a -> a) -> TypeParameter a -> a #

toList :: TypeParameter a -> [a] #

null :: TypeParameter a -> Bool #

length :: TypeParameter a -> Int #

elem :: Eq a => a -> TypeParameter a -> Bool #

maximum :: Ord a => TypeParameter a -> a #

minimum :: Ord a => TypeParameter a -> a #

sum :: Num a => TypeParameter a -> a #

product :: Num a => TypeParameter a -> a #

Traversable TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TypeParameter a -> f (TypeParameter b) #

sequenceA :: Applicative f => TypeParameter (f a) -> f (TypeParameter a) #

mapM :: Monad m => (a -> m b) -> TypeParameter a -> m (TypeParameter b) #

sequence :: Monad m => TypeParameter (m a) -> m (TypeParameter a) #

SymbolMatching TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeParameter a)

Eq a => Eq (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TypeParameter a) :: Type -> Type #

Generic1 TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TypeParameter :: k -> Type #

type Rep (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TypeParameter a) = D1 (MetaData "TypeParameter" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeParameter" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (((Annotation :+: Identifier) :+: (MarkerAnnotation :+: TypeBound)) a)))))
type Rep1 TypeParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 TypeParameter = D1 (MetaData "TypeParameter" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeParameter" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 ((Annotation :+: Identifier) :+: (MarkerAnnotation :+: TypeBound)))))

data TypeBound a Source #

Constructors

TypeBound 

Fields

Instances
Functor TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> TypeBound a -> TypeBound b #

(<$) :: a -> TypeBound b -> TypeBound a #

Foldable TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TypeBound m -> m #

foldMap :: Monoid m => (a -> m) -> TypeBound a -> m #

foldr :: (a -> b -> b) -> b -> TypeBound a -> b #

foldr' :: (a -> b -> b) -> b -> TypeBound a -> b #

foldl :: (b -> a -> b) -> b -> TypeBound a -> b #

foldl' :: (b -> a -> b) -> b -> TypeBound a -> b #

foldr1 :: (a -> a -> a) -> TypeBound a -> a #

foldl1 :: (a -> a -> a) -> TypeBound a -> a #

toList :: TypeBound a -> [a] #

null :: TypeBound a -> Bool #

length :: TypeBound a -> Int #

elem :: Eq a => a -> TypeBound a -> Bool #

maximum :: Ord a => TypeBound a -> a #

minimum :: Ord a => TypeBound a -> a #

sum :: Num a => TypeBound a -> a #

product :: Num a => TypeBound a -> a #

Traversable TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TypeBound a -> f (TypeBound b) #

sequenceA :: Applicative f => TypeBound (f a) -> f (TypeBound a) #

mapM :: Monad m => (a -> m b) -> TypeBound a -> m (TypeBound b) #

sequence :: Monad m => TypeBound (m a) -> m (TypeBound a) #

SymbolMatching TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy TypeBound -> Node -> Bool

showFailure :: Proxy TypeBound -> Node -> String

Unmarshal TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeBound a)

Eq a => Eq (TypeBound a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: TypeBound a -> TypeBound a -> Bool #

(/=) :: TypeBound a -> TypeBound a -> Bool #

Ord a => Ord (TypeBound a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TypeBound a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TypeBound a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TypeBound a) :: Type -> Type #

Methods

from :: TypeBound a -> Rep (TypeBound a) x #

to :: Rep (TypeBound a) x -> TypeBound a #

Generic1 TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TypeBound :: k -> Type #

type Rep (TypeBound a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TypeBound a) = D1 (MetaData "TypeBound" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeBound" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (Type a)))))
type Rep1 TypeBound Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 TypeBound = D1 (MetaData "TypeBound" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeBound" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 Type)))

data TypeArguments a Source #

Constructors

TypeArguments 

Fields

Instances
Functor TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> TypeArguments a -> TypeArguments b #

(<$) :: a -> TypeArguments b -> TypeArguments a #

Foldable TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TypeArguments m -> m #

foldMap :: Monoid m => (a -> m) -> TypeArguments a -> m #

foldr :: (a -> b -> b) -> b -> TypeArguments a -> b #

foldr' :: (a -> b -> b) -> b -> TypeArguments a -> b #

foldl :: (b -> a -> b) -> b -> TypeArguments a -> b #

foldl' :: (b -> a -> b) -> b -> TypeArguments a -> b #

foldr1 :: (a -> a -> a) -> TypeArguments a -> a #

foldl1 :: (a -> a -> a) -> TypeArguments a -> a #

toList :: TypeArguments a -> [a] #

null :: TypeArguments a -> Bool #

length :: TypeArguments a -> Int #

elem :: Eq a => a -> TypeArguments a -> Bool #

maximum :: Ord a => TypeArguments a -> a #

minimum :: Ord a => TypeArguments a -> a #

sum :: Num a => TypeArguments a -> a #

product :: Num a => TypeArguments a -> a #

Traversable TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TypeArguments a -> f (TypeArguments b) #

sequenceA :: Applicative f => TypeArguments (f a) -> f (TypeArguments a) #

mapM :: Monad m => (a -> m b) -> TypeArguments a -> m (TypeArguments b) #

sequence :: Monad m => TypeArguments (m a) -> m (TypeArguments a) #

SymbolMatching TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeArguments a)

Eq a => Eq (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TypeArguments a) :: Type -> Type #

Generic1 TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TypeArguments :: k -> Type #

type Rep (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TypeArguments a) = D1 (MetaData "TypeArguments" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeArguments" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Type :+: Wildcard) a])))
type Rep1 TypeArguments Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 TypeArguments = D1 (MetaData "TypeArguments" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TypeArguments" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 (Type :+: Wildcard))))

data TryWithResourcesStatement a Source #

Instances
Functor TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TryWithResourcesStatement m -> m #

foldMap :: Monoid m => (a -> m) -> TryWithResourcesStatement a -> m #

foldr :: (a -> b -> b) -> b -> TryWithResourcesStatement a -> b #

foldr' :: (a -> b -> b) -> b -> TryWithResourcesStatement a -> b #

foldl :: (b -> a -> b) -> b -> TryWithResourcesStatement a -> b #

foldl' :: (b -> a -> b) -> b -> TryWithResourcesStatement a -> b #

foldr1 :: (a -> a -> a) -> TryWithResourcesStatement a -> a #

foldl1 :: (a -> a -> a) -> TryWithResourcesStatement a -> a #

toList :: TryWithResourcesStatement a -> [a] #

null :: TryWithResourcesStatement a -> Bool #

length :: TryWithResourcesStatement a -> Int #

elem :: Eq a => a -> TryWithResourcesStatement a -> Bool #

maximum :: Ord a => TryWithResourcesStatement a -> a #

minimum :: Ord a => TryWithResourcesStatement a -> a #

sum :: Num a => TryWithResourcesStatement a -> a #

product :: Num a => TryWithResourcesStatement a -> a #

Traversable TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TryWithResourcesStatement a)

Eq a => Eq (TryWithResourcesStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TryWithResourcesStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TryWithResourcesStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TryWithResourcesStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TryWithResourcesStatement a) :: Type -> Type #

Generic1 TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TryWithResourcesStatement :: k -> Type #

type Rep (TryWithResourcesStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TryWithResourcesStatement a) = D1 (MetaData "TryWithResourcesStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TryWithResourcesStatement" PrefixI True) ((S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "body") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block a))) :*: (S1 (MetaSel (Just "resources") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ResourceSpecification a)) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(CatchClause :+: FinallyClause) a]))))
type Rep1 TryWithResourcesStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

data TryStatement a Source #

Constructors

TryStatement 
Instances
Functor TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> TryStatement a -> TryStatement b #

(<$) :: a -> TryStatement b -> TryStatement a #

Foldable TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TryStatement m -> m #

foldMap :: Monoid m => (a -> m) -> TryStatement a -> m #

foldr :: (a -> b -> b) -> b -> TryStatement a -> b #

foldr' :: (a -> b -> b) -> b -> TryStatement a -> b #

foldl :: (b -> a -> b) -> b -> TryStatement a -> b #

foldl' :: (b -> a -> b) -> b -> TryStatement a -> b #

foldr1 :: (a -> a -> a) -> TryStatement a -> a #

foldl1 :: (a -> a -> a) -> TryStatement a -> a #

toList :: TryStatement a -> [a] #

null :: TryStatement a -> Bool #

length :: TryStatement a -> Int #

elem :: Eq a => a -> TryStatement a -> Bool #

maximum :: Ord a => TryStatement a -> a #

minimum :: Ord a => TryStatement a -> a #

sum :: Num a => TryStatement a -> a #

product :: Num a => TryStatement a -> a #

Traversable TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TryStatement a -> f (TryStatement b) #

sequenceA :: Applicative f => TryStatement (f a) -> f (TryStatement a) #

mapM :: Monad m => (a -> m b) -> TryStatement a -> m (TryStatement b) #

sequence :: Monad m => TryStatement (m a) -> m (TryStatement a) #

SymbolMatching TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TryStatement a)

Eq a => Eq (TryStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TryStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TryStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TryStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TryStatement a) :: Type -> Type #

Methods

from :: TryStatement a -> Rep (TryStatement a) x #

to :: Rep (TryStatement a) x -> TryStatement a #

Generic1 TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TryStatement :: k -> Type #

type Rep (TryStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TryStatement a) = D1 (MetaData "TryStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TryStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: (S1 (MetaSel (Just "body") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block a)) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((CatchClause :+: FinallyClause) a))))))
type Rep1 TryStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

data Throws a Source #

Constructors

Throws 

Fields

Instances
Functor Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Throws a -> Throws b #

(<$) :: a -> Throws b -> Throws a #

Foldable Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Throws m -> m #

foldMap :: Monoid m => (a -> m) -> Throws a -> m #

foldr :: (a -> b -> b) -> b -> Throws a -> b #

foldr' :: (a -> b -> b) -> b -> Throws a -> b #

foldl :: (b -> a -> b) -> b -> Throws a -> b #

foldl' :: (b -> a -> b) -> b -> Throws a -> b #

foldr1 :: (a -> a -> a) -> Throws a -> a #

foldl1 :: (a -> a -> a) -> Throws a -> a #

toList :: Throws a -> [a] #

null :: Throws a -> Bool #

length :: Throws a -> Int #

elem :: Eq a => a -> Throws a -> Bool #

maximum :: Ord a => Throws a -> a #

minimum :: Ord a => Throws a -> a #

sum :: Num a => Throws a -> a #

product :: Num a => Throws a -> a #

Traversable Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Throws a -> f (Throws b) #

sequenceA :: Applicative f => Throws (f a) -> f (Throws a) #

mapM :: Monad m => (a -> m b) -> Throws a -> m (Throws b) #

sequence :: Monad m => Throws (m a) -> m (Throws a) #

SymbolMatching Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Throws -> Node -> Bool

showFailure :: Proxy Throws -> Node -> String

Unmarshal Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Throws a)

Eq a => Eq (Throws a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Throws a -> Throws a -> Bool #

(/=) :: Throws a -> Throws a -> Bool #

Ord a => Ord (Throws a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Throws a -> Throws a -> Ordering #

(<) :: Throws a -> Throws a -> Bool #

(<=) :: Throws a -> Throws a -> Bool #

(>) :: Throws a -> Throws a -> Bool #

(>=) :: Throws a -> Throws a -> Bool #

max :: Throws a -> Throws a -> Throws a #

min :: Throws a -> Throws a -> Throws a #

Show a => Show (Throws a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Throws a -> ShowS #

show :: Throws a -> String #

showList :: [Throws a] -> ShowS #

Generic (Throws a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Throws a) :: Type -> Type #

Methods

from :: Throws a -> Rep (Throws a) x #

to :: Rep (Throws a) x -> Throws a #

Generic1 Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Throws :: k -> Type #

Methods

from1 :: Throws a -> Rep1 Throws a #

to1 :: Rep1 Throws a -> Throws a #

type Rep (Throws a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Throws a) = D1 (MetaData "Throws" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Throws" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (Type a)))))
type Rep1 Throws Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Throws = D1 (MetaData "Throws" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "Throws" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 Type)))

data ThrowStatement a Source #

Constructors

ThrowStatement 

Fields

Instances
Functor ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ThrowStatement a -> ThrowStatement b #

(<$) :: a -> ThrowStatement b -> ThrowStatement a #

Foldable ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ThrowStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ThrowStatement a -> m #

foldr :: (a -> b -> b) -> b -> ThrowStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ThrowStatement a -> b #

foldl :: (b -> a -> b) -> b -> ThrowStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ThrowStatement a -> b #

foldr1 :: (a -> a -> a) -> ThrowStatement a -> a #

foldl1 :: (a -> a -> a) -> ThrowStatement a -> a #

toList :: ThrowStatement a -> [a] #

null :: ThrowStatement a -> Bool #

length :: ThrowStatement a -> Int #

elem :: Eq a => a -> ThrowStatement a -> Bool #

maximum :: Ord a => ThrowStatement a -> a #

minimum :: Ord a => ThrowStatement a -> a #

sum :: Num a => ThrowStatement a -> a #

product :: Num a => ThrowStatement a -> a #

Traversable ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ThrowStatement a -> f (ThrowStatement b) #

sequenceA :: Applicative f => ThrowStatement (f a) -> f (ThrowStatement a) #

mapM :: Monad m => (a -> m b) -> ThrowStatement a -> m (ThrowStatement b) #

sequence :: Monad m => ThrowStatement (m a) -> m (ThrowStatement a) #

SymbolMatching ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ThrowStatement a)

Eq a => Eq (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ThrowStatement a) :: Type -> Type #

Generic1 ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ThrowStatement :: k -> Type #

type Rep (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ThrowStatement a) = D1 (MetaData "ThrowStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "ThrowStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a))))
type Rep1 ThrowStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ThrowStatement = D1 (MetaData "ThrowStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "ThrowStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Expression)))

data TernaryExpression a Source #

Constructors

TernaryExpression 

Fields

Instances
Functor TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => TernaryExpression m -> m #

foldMap :: Monoid m => (a -> m) -> TernaryExpression a -> m #

foldr :: (a -> b -> b) -> b -> TernaryExpression a -> b #

foldr' :: (a -> b -> b) -> b -> TernaryExpression a -> b #

foldl :: (b -> a -> b) -> b -> TernaryExpression a -> b #

foldl' :: (b -> a -> b) -> b -> TernaryExpression a -> b #

foldr1 :: (a -> a -> a) -> TernaryExpression a -> a #

foldl1 :: (a -> a -> a) -> TernaryExpression a -> a #

toList :: TernaryExpression a -> [a] #

null :: TernaryExpression a -> Bool #

length :: TernaryExpression a -> Int #

elem :: Eq a => a -> TernaryExpression a -> Bool #

maximum :: Ord a => TernaryExpression a -> a #

minimum :: Ord a => TernaryExpression a -> a #

sum :: Num a => TernaryExpression a -> a #

product :: Num a => TernaryExpression a -> a #

Traversable TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> TernaryExpression a -> f (TernaryExpression b) #

sequenceA :: Applicative f => TernaryExpression (f a) -> f (TernaryExpression a) #

mapM :: Monad m => (a -> m b) -> TernaryExpression a -> m (TernaryExpression b) #

sequence :: Monad m => TernaryExpression (m a) -> m (TernaryExpression a) #

SymbolMatching TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

unmarshalNode :: (Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TernaryExpression a)

Eq a => Eq (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (TernaryExpression a) :: Type -> Type #

Generic1 TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 TernaryExpression :: k -> Type #

type Rep (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (TernaryExpression a) = D1 (MetaData "TernaryExpression" "TreeSitter.Java.AST" "tree-sitter-java-0.4.0.0-inplace" False) (C1 (MetaCons "TernaryExpression" PrefixI True) ((S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "alternative") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a))) :*: (S1 (MetaSel (Just "consequence") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a)) :*: S1 (MetaSel (Just "condition") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a)))))
type Rep1 TernaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data SynchronizedStatement a Source #

Instances
Functor SynchronizedStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable SynchronizedStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => SynchronizedStatement m -> m #

foldMap :: Monoid m => (a -> m) -> SynchronizedStatement a -> m #

foldr :: (a -> b -> b) -> b -> SynchronizedStatement a -> b #

foldr' :: (a -> b -> b) -> b -> SynchronizedStatement a -> b #

foldl :: (b -> a -> b) -> b -> SynchronizedStatement a -> b #

foldl' :: (b -> a -> b) -> b -> SynchronizedStatement a -> b #

foldr1 :: (a -> a -> a) -> SynchronizedStatement a -> a #

foldl1 :: (a -> a -> a) -> SynchronizedStatement a -> a #