tree-sitter-java-0.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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.6.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 #

toList :: SynchronizedStatement a -> [a] #

null :: SynchronizedStatement a -> Bool #

length :: SynchronizedStatement a -> Int #

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

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

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

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

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

Traversable SynchronizedStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching SynchronizedStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SynchronizedStatement 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 (SynchronizedStatement a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (SynchronizedStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 SynchronizedStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SynchronizedStatement :: k -> Type #

type Rep (SynchronizedStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data SwitchStatement a Source #

Constructors

SwitchStatement 
Instances
Functor SwitchStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable SwitchStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: SwitchStatement a -> [a] #

null :: SwitchStatement a -> Bool #

length :: SwitchStatement a -> Int #

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

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

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

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

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

Traversable SwitchStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching SwitchStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SwitchStatement 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 (SwitchStatement a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (SwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 SwitchStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SwitchStatement :: k -> Type #

type Rep (SwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

data SwitchLabel a Source #

Constructors

SwitchLabel 

Fields

Instances
Functor SwitchLabel Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable SwitchLabel Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: SwitchLabel a -> [a] #

null :: SwitchLabel a -> Bool #

length :: SwitchLabel a -> Int #

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

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

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

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

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

Traversable SwitchLabel Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching SwitchLabel Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SwitchLabel 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 (SwitchLabel a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (SwitchLabel a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 SwitchLabel Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SwitchLabel :: k -> Type #

type Rep (SwitchLabel a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data SwitchBlock a Source #

Constructors

SwitchBlock 

Fields

Instances
Functor SwitchBlock Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable SwitchBlock Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: SwitchBlock a -> [a] #

null :: SwitchBlock a -> Bool #

length :: SwitchBlock a -> Int #

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

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

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

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

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

Traversable SwitchBlock Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching SwitchBlock Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SwitchBlock 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 (SwitchBlock a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (SwitchBlock a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 SwitchBlock Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SwitchBlock :: k -> Type #

type Rep (SwitchBlock a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data Superclass a Source #

Constructors

Superclass 

Fields

Instances
Functor Superclass Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable Superclass Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: Superclass a -> [a] #

null :: Superclass a -> Bool #

length :: Superclass a -> Int #

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

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

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

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

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

Traversable Superclass Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching Superclass Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal Superclass 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 (Superclass a)

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

Defined in TreeSitter.Java.AST

Methods

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

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (Superclass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 Superclass Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Superclass :: k -> Type #

type Rep (Superclass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data SuperInterfaces a Source #

Constructors

SuperInterfaces 

Fields

Instances
Functor SuperInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable SuperInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: SuperInterfaces a -> [a] #

null :: SuperInterfaces a -> Bool #

length :: SuperInterfaces a -> Int #

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

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

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

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

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

Traversable SuperInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching SuperInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SuperInterfaces 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 (SuperInterfaces a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (SuperInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 SuperInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SuperInterfaces :: k -> Type #

type Rep (SuperInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data StaticInitializer a Source #

Constructors

StaticInitializer 

Fields

Instances
Functor StaticInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable StaticInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: StaticInitializer a -> [a] #

null :: StaticInitializer a -> Bool #

length :: StaticInitializer a -> Int #

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

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

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

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

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

Traversable StaticInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching StaticInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal StaticInitializer 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 (StaticInitializer a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (StaticInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 StaticInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 StaticInitializer :: k -> Type #

type Rep (StaticInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data SpreadParameter a Source #

Instances
Functor SpreadParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable SpreadParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: SpreadParameter a -> [a] #

null :: SpreadParameter a -> Bool #

length :: SpreadParameter a -> Int #

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

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

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

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

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

Traversable SpreadParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching SpreadParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SpreadParameter 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 (SpreadParameter a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (SpreadParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 SpreadParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SpreadParameter :: k -> Type #

type Rep (SpreadParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 SpreadParameter = D1 (MetaData "SpreadParameter" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "SpreadParameter" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (UnannotatedType :+: (Modifiers :+: VariableDeclarator)))))

data ScopedTypeIdentifier a Source #

Instances
Functor ScopedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ScopedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ScopedTypeIdentifier a -> [a] #

null :: ScopedTypeIdentifier a -> Bool #

length :: ScopedTypeIdentifier a -> Int #

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

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

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

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

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

Traversable ScopedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ScopedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ScopedTypeIdentifier 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 (ScopedTypeIdentifier a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ScopedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ScopedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ScopedTypeIdentifier :: k -> Type #

type Rep (ScopedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

data ScopedIdentifier a Source #

Instances
Functor ScopedIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable ScopedIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ScopedIdentifier a -> [a] #

null :: ScopedIdentifier a -> Bool #

length :: ScopedIdentifier a -> Int #

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

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

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

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

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

Traversable ScopedIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching ScopedIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ScopedIdentifier 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 (ScopedIdentifier a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ScopedIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ScopedIdentifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ScopedIdentifier :: k -> Type #

type Rep (ScopedIdentifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data ReturnStatement a Source #

Constructors

ReturnStatement 

Fields

Instances
Functor ReturnStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable ReturnStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ReturnStatement a -> [a] #

null :: ReturnStatement a -> Bool #

length :: ReturnStatement a -> Int #

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

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

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

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

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

Traversable ReturnStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching ReturnStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ReturnStatement 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 (ReturnStatement a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ReturnStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ReturnStatement :: k -> Type #

type Rep (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data ResourceSpecification a Source #

Constructors

ResourceSpecification 

Fields

Instances
Functor ResourceSpecification Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ResourceSpecification Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ResourceSpecification a -> [a] #

null :: ResourceSpecification a -> Bool #

length :: ResourceSpecification a -> Int #

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

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

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

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

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

Traversable ResourceSpecification Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ResourceSpecification Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ResourceSpecification 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 (ResourceSpecification a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ResourceSpecification a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ResourceSpecification Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ResourceSpecification :: k -> Type #

type Rep (ResourceSpecification a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data Resource a Source #

Instances
Functor Resource Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable Resource Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: Resource a -> [a] #

null :: Resource a -> Bool #

length :: Resource a -> Int #

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

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

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

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

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

Traversable Resource Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching Resource Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Resource -> Node -> Bool

showFailure :: Proxy Resource -> Node -> String

Unmarshal Resource 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 (Resource a)

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

Defined in TreeSitter.Java.AST

Methods

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

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

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

Defined in TreeSitter.Java.AST

Methods

compare :: Resource a -> Resource a -> Ordering #

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

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

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

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

max :: Resource a -> Resource a -> Resource a #

min :: Resource a -> Resource a -> Resource a #

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

Defined in TreeSitter.Java.AST

Methods

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

show :: Resource a -> String #

showList :: [Resource a] -> ShowS #

Generic (Resource a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 Resource Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Resource :: k -> Type #

Methods

from1 :: Resource a -> Rep1 Resource a #

to1 :: Rep1 Resource a -> Resource a #

type Rep (Resource a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Resource Source # 
Instance details

Defined in TreeSitter.Java.AST

data RequiresModifier a Source #

Constructors

RequiresModifier 

Fields

Instances
Functor RequiresModifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable RequiresModifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: RequiresModifier a -> [a] #

null :: RequiresModifier a -> Bool #

length :: RequiresModifier a -> Int #

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

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

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

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

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

Traversable RequiresModifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching RequiresModifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal RequiresModifier 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 (RequiresModifier a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (RequiresModifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 RequiresModifier Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 RequiresModifier :: k -> Type #

type Rep (RequiresModifier a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data ReceiverParameter a Source #

Instances
Functor ReceiverParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ReceiverParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ReceiverParameter a -> [a] #

null :: ReceiverParameter a -> Bool #

length :: ReceiverParameter a -> Int #

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

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

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

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

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

Traversable ReceiverParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching ReceiverParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ReceiverParameter 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 (ReceiverParameter a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ReceiverParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ReceiverParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ReceiverParameter :: k -> Type #

type Rep (ReceiverParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data Program a Source #

Constructors

Program 

Fields

Instances
Functor Program Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable Program Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: Program a -> [a] #

null :: Program a -> Bool #

length :: Program a -> Int #

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

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

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

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

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

Traversable Program Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching Program Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Program -> Node -> Bool

showFailure :: Proxy Program -> Node -> String

Unmarshal Program 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 (Program a)

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

Defined in TreeSitter.Java.AST

Methods

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

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

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

Defined in TreeSitter.Java.AST

Methods

compare :: Program a -> Program a -> Ordering #

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

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

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

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

max :: Program a -> Program a -> Program a #

min :: Program a -> Program a -> Program a #

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

Defined in TreeSitter.Java.AST

Methods

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

show :: Program a -> String #

showList :: [Program a] -> ShowS #

Generic (Program a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 Program Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Program :: k -> Type #

Methods

from1 :: Program a -> Rep1 Program a #

to1 :: Rep1 Program a -> Program a #

type Rep (Program a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data ParenthesizedExpression a Source #

Constructors

ParenthesizedExpression 

Fields

Instances
Functor ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ParenthesizedExpression a -> [a] #

null :: ParenthesizedExpression a -> Bool #

length :: ParenthesizedExpression a -> Int #

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

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

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

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

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

Traversable ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ParenthesizedExpression 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 (ParenthesizedExpression a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ParenthesizedExpression :: k -> Type #

type Rep (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data PackageDeclaration a Source #

Instances
Functor PackageDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable PackageDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: PackageDeclaration a -> [a] #

null :: PackageDeclaration a -> Bool #

length :: PackageDeclaration a -> Int #

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

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

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

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

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

Traversable PackageDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching PackageDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal PackageDeclaration 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 (PackageDeclaration a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (PackageDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 PackageDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 PackageDeclaration :: k -> Type #

type Rep (PackageDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data ObjectCreationExpression a Source #

Instances
Functor ObjectCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ObjectCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ObjectCreationExpression a -> [a] #

null :: ObjectCreationExpression a -> Bool #

length :: ObjectCreationExpression a -> Int #

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

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

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

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

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

Traversable ObjectCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ObjectCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ObjectCreationExpression 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 (ObjectCreationExpression a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ObjectCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ObjectCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ObjectCreationExpression :: k -> Type #

type Rep (ObjectCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ObjectCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data ModuleName a Source #

Constructors

ModuleName 
Instances
Functor ModuleName Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable ModuleName Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ModuleName a -> [a] #

null :: ModuleName a -> Bool #

length :: ModuleName a -> Int #

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

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

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

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

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

Traversable ModuleName Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching ModuleName Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ModuleName 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 (ModuleName a)

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

Defined in TreeSitter.Java.AST

Methods

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

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ModuleName a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 ModuleName Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ModuleName :: k -> Type #

type Rep (ModuleName a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data ModuleDirective a Source #

Instances
Functor ModuleDirective Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable ModuleDirective Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ModuleDirective a -> [a] #

null :: ModuleDirective a -> Bool #

length :: ModuleDirective a -> Int #

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

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

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

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

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

Traversable ModuleDirective Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching ModuleDirective Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ModuleDirective 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 (ModuleDirective a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ModuleDirective a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ModuleDirective Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ModuleDirective :: k -> Type #

type Rep (ModuleDirective a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 ModuleDirective = D1 (MetaData "ModuleDirective" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ModuleDirective" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 ((Identifier :+: ModuleName) :+: (RequiresModifier :+: ScopedIdentifier)))))

data ModuleDeclaration a Source #

Instances
Functor ModuleDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ModuleDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: ModuleDeclaration a -> [a] #

null :: ModuleDeclaration a -> Bool #

length :: ModuleDeclaration a -> Int #

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

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

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

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

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

Traversable ModuleDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching ModuleDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ModuleDeclaration 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 (ModuleDeclaration a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (ModuleDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 ModuleDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ModuleDeclaration :: k -> Type #

type Rep (ModuleDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

data Modifiers a Source #

Constructors

Modifiers 
Instances
Functor Modifiers Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable Modifiers Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: Modifiers a -> [a] #

null :: Modifiers a -> Bool #

length :: Modifiers a -> Int #

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

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

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

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

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

Traversable Modifiers Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching Modifiers Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Modifiers -> Node -> Bool

showFailure :: Proxy Modifiers -> Node -> String

Unmarshal Modifiers 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 (Modifiers a)

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

Defined in TreeSitter.Java.AST

Methods

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

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (Modifiers a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 Modifiers Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Modifiers :: k -> Type #

type Rep (Modifiers a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data MethodReference a Source #

Instances
Functor MethodReference Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable MethodReference Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: MethodReference a -> [a] #

null :: MethodReference a -> Bool #

length :: MethodReference a -> Int #

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

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

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

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

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

Traversable MethodReference Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching MethodReference Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal MethodReference 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 (MethodReference a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (MethodReference a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 MethodReference Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 MethodReference :: k -> Type #

type Rep (MethodReference a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 MethodReference = D1 (MetaData "MethodReference" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "MethodReference" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 ((Primary :+: (Type :+: Identifier)) :+: (ScopedIdentifier :+: (Super :+: TypeArguments))))))

data MethodInvocation a Source #

Instances
Functor MethodInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable MethodInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: MethodInvocation a -> [a] #

null :: MethodInvocation a -> Bool #

length :: MethodInvocation a -> Int #

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

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

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

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

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

Traversable MethodInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching MethodInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal MethodInvocation 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 (MethodInvocation a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (MethodInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 MethodInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 MethodInvocation :: k -> Type #

type Rep (MethodInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 MethodInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

data MethodDeclaration a Source #

Instances
Functor MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: MethodDeclaration a -> [a] #

null :: MethodDeclaration a -> Bool #

length :: MethodDeclaration a -> Int #

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

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

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

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

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

Traversable MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal MethodDeclaration 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 (MethodDeclaration a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 MethodDeclaration :: k -> Type #

type Rep (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data MarkerAnnotation a Source #

Constructors

MarkerAnnotation 
Instances
Functor MarkerAnnotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable MarkerAnnotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: MarkerAnnotation a -> [a] #

null :: MarkerAnnotation a -> Bool #

length :: MarkerAnnotation a -> Int #

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

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

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

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

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

Traversable MarkerAnnotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching MarkerAnnotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal MarkerAnnotation 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 (MarkerAnnotation a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (MarkerAnnotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 MarkerAnnotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 MarkerAnnotation :: k -> Type #

type Rep (MarkerAnnotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data LocalVariableDeclarationStatement a Source #

Instances
Functor LocalVariableDeclarationStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable LocalVariableDeclarationStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable LocalVariableDeclarationStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching LocalVariableDeclarationStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal LocalVariableDeclarationStatement 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 (LocalVariableDeclarationStatement a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (LocalVariableDeclarationStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 LocalVariableDeclarationStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 LocalVariableDeclarationStatement :: k -> Type #

type Rep (LocalVariableDeclarationStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data LocalVariableDeclaration a Source #

Instances
Functor LocalVariableDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable LocalVariableDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: LocalVariableDeclaration a -> [a] #

null :: LocalVariableDeclaration a -> Bool #

length :: LocalVariableDeclaration a -> Int #

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

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

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

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

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

Traversable LocalVariableDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching LocalVariableDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal LocalVariableDeclaration 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 (LocalVariableDeclaration a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (LocalVariableDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 LocalVariableDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 LocalVariableDeclaration :: k -> Type #

type Rep (LocalVariableDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (LocalVariableDeclaration a) = D1 (MetaData "LocalVariableDeclaration" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "LocalVariableDeclaration" PrefixI True) ((S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "declarator") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (VariableDeclarator a)))) :*: (S1 (MetaSel (Just "type'") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (UnannotatedType a)) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Modifiers a))))))
type Rep1 LocalVariableDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data LambdaExpression a Source #

Instances
Functor LambdaExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable LambdaExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: LambdaExpression a -> [a] #

null :: LambdaExpression a -> Bool #

length :: LambdaExpression a -> Int #

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

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

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

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

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

Traversable LambdaExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching LambdaExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal LambdaExpression 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 (LambdaExpression a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (LambdaExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 LambdaExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 LambdaExpression :: k -> Type #

type Rep (LambdaExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 LambdaExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data LabeledStatement a Source #

Instances
Functor LabeledStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable LabeledStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: LabeledStatement a -> [a] #

null :: LabeledStatement a -> Bool #

length :: LabeledStatement a -> Int #

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

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

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

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

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

Traversable LabeledStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching LabeledStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal LabeledStatement 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 (LabeledStatement a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 LabeledStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 LabeledStatement :: k -> Type #

type Rep (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data InterfaceTypeList a Source #

Constructors

InterfaceTypeList 

Fields

Instances
Functor InterfaceTypeList Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable InterfaceTypeList Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: InterfaceTypeList a -> [a] #

null :: InterfaceTypeList a -> Bool #

length :: InterfaceTypeList a -> Int #

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

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

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

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

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

Traversable InterfaceTypeList Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching InterfaceTypeList Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal InterfaceTypeList 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 (InterfaceTypeList a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (InterfaceTypeList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 InterfaceTypeList Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 InterfaceTypeList :: k -> Type #

type Rep (InterfaceTypeList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

data InterfaceDeclaration a Source #

Instances
Functor InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: InterfaceDeclaration a -> [a] #

null :: InterfaceDeclaration a -> Bool #

length :: InterfaceDeclaration a -> Int #

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

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

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

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

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

Traversable InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal InterfaceDeclaration 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 (InterfaceDeclaration a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 InterfaceDeclaration :: k -> Type #

type Rep (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data InterfaceBody a Source #

Instances
Functor InterfaceBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable InterfaceBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: InterfaceBody a -> [a] #

null :: InterfaceBody a -> Bool #

length :: InterfaceBody a -> Int #

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

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

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

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

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

Traversable InterfaceBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching InterfaceBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal InterfaceBody 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 (InterfaceBody a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (InterfaceBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 InterfaceBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 InterfaceBody :: k -> Type #

type Rep (InterfaceBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 InterfaceBody Source # 
Instance details

Defined in TreeSitter.Java.AST

data IntegralType a Source #

Constructors

IntegralType 

Fields

Instances
Functor IntegralType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable IntegralType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: IntegralType a -> [a] #

null :: IntegralType a -> Bool #

length :: IntegralType a -> Int #

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

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

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

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

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

Traversable IntegralType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching IntegralType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal IntegralType 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 (IntegralType a)

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (IntegralType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

from :: IntegralType a -> Rep (IntegralType a) x #

to :: Rep (IntegralType a) x -> IntegralType a #

Generic1 IntegralType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 IntegralType :: k -> Type #

type Rep (IntegralType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (IntegralType a) = D1 (MetaData "IntegralType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "IntegralType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 IntegralType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 IntegralType = D1 (MetaData "IntegralType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "IntegralType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data InstanceofExpression a Source #

Constructors

InstanceofExpression 

Fields

Instances
Functor InstanceofExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable InstanceofExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => InstanceofExpression m -> m #

foldMap :: Monoid m => (a -> m) -> InstanceofExpression a -> m #

foldr :: (a -> b -> b) -> b -> InstanceofExpression a -> b #

foldr' :: (a -> b -> b) -> b -> InstanceofExpression a -> b #

foldl :: (b -> a -> b) -> b -> InstanceofExpression a -> b #

foldl' :: (b -> a -> b) -> b -> InstanceofExpression a -> b #

foldr1 :: (a -> a -> a) -> InstanceofExpression a -> a #

foldl1 :: (a -> a -> a) -> InstanceofExpression a -> a #

toList :: InstanceofExpression a -> [a] #

null :: InstanceofExpression a -> Bool #

length :: InstanceofExpression a -> Int #

elem :: Eq a => a -> InstanceofExpression a -> Bool #

maximum :: Ord a => InstanceofExpression a -> a #

minimum :: Ord a => InstanceofExpression a -> a #

sum :: Num a => InstanceofExpression a -> a #

product :: Num a => InstanceofExpression a -> a #

Traversable InstanceofExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching InstanceofExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal InstanceofExpression 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 (InstanceofExpression a)

Eq a => Eq (InstanceofExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (InstanceofExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (InstanceofExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (InstanceofExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (InstanceofExpression a) :: Type -> Type #

Generic1 InstanceofExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 InstanceofExpression :: k -> Type #

type Rep (InstanceofExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (InstanceofExpression a) = D1 (MetaData "InstanceofExpression" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "InstanceofExpression" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: (S1 (MetaSel (Just "left") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a)) :*: S1 (MetaSel (Just "right") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Type a)))))
type Rep1 InstanceofExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 InstanceofExpression = D1 (MetaData "InstanceofExpression" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "InstanceofExpression" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: (S1 (MetaSel (Just "left") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Expression) :*: S1 (MetaSel (Just "right") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Type))))

data InferredParameters a Source #

Constructors

InferredParameters 

Fields

Instances
Functor InferredParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable InferredParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => InferredParameters m -> m #

foldMap :: Monoid m => (a -> m) -> InferredParameters a -> m #

foldr :: (a -> b -> b) -> b -> InferredParameters a -> b #

foldr' :: (a -> b -> b) -> b -> InferredParameters a -> b #

foldl :: (b -> a -> b) -> b -> InferredParameters a -> b #

foldl' :: (b -> a -> b) -> b -> InferredParameters a -> b #

foldr1 :: (a -> a -> a) -> InferredParameters a -> a #

foldl1 :: (a -> a -> a) -> InferredParameters a -> a #

toList :: InferredParameters a -> [a] #

null :: InferredParameters a -> Bool #

length :: InferredParameters a -> Int #

elem :: Eq a => a -> InferredParameters a -> Bool #

maximum :: Ord a => InferredParameters a -> a #

minimum :: Ord a => InferredParameters a -> a #

sum :: Num a => InferredParameters a -> a #

product :: Num a => InferredParameters a -> a #

Traversable InferredParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching InferredParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal InferredParameters 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 (InferredParameters a)

Eq a => Eq (InferredParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (InferredParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (InferredParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (InferredParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (InferredParameters a) :: Type -> Type #

Generic1 InferredParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 InferredParameters :: k -> Type #

type Rep (InferredParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (InferredParameters a) = D1 (MetaData "InferredParameters" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "InferredParameters" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (Identifier a)))))
type Rep1 InferredParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 InferredParameters = D1 (MetaData "InferredParameters" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "InferredParameters" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 Identifier)))

data ImportDeclaration a Source #

Instances
Functor ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ImportDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ImportDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ImportDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ImportDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ImportDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ImportDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ImportDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ImportDeclaration a -> a #

toList :: ImportDeclaration a -> [a] #

null :: ImportDeclaration a -> Bool #

length :: ImportDeclaration a -> Int #

elem :: Eq a => a -> ImportDeclaration a -> Bool #

maximum :: Ord a => ImportDeclaration a -> a #

minimum :: Ord a => ImportDeclaration a -> a #

sum :: Num a => ImportDeclaration a -> a #

product :: Num a => ImportDeclaration a -> a #

Traversable ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportDeclaration a -> f (ImportDeclaration b) #

sequenceA :: Applicative f => ImportDeclaration (f a) -> f (ImportDeclaration a) #

mapM :: Monad m => (a -> m b) -> ImportDeclaration a -> m (ImportDeclaration b) #

sequence :: Monad m => ImportDeclaration (m a) -> m (ImportDeclaration a) #

SymbolMatching ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ImportDeclaration 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 (ImportDeclaration a)

Eq a => Eq (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ImportDeclaration a) :: Type -> Type #

Generic1 ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ImportDeclaration :: k -> Type #

type Rep (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ImportDeclaration a) = D1 (MetaData "ImportDeclaration" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ImportDeclaration" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((Asterisk :+: Identifier) a)))))
type Rep1 ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ImportDeclaration = D1 (MetaData "ImportDeclaration" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ImportDeclaration" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (Asterisk :+: Identifier))))

data IfStatement a Source #

Instances
Functor IfStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> IfStatement a -> IfStatement b #

(<$) :: a -> IfStatement b -> IfStatement a #

Foldable IfStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => IfStatement m -> m #

foldMap :: Monoid m => (a -> m) -> IfStatement a -> m #

foldr :: (a -> b -> b) -> b -> IfStatement a -> b #

foldr' :: (a -> b -> b) -> b -> IfStatement a -> b #

foldl :: (b -> a -> b) -> b -> IfStatement a -> b #

foldl' :: (b -> a -> b) -> b -> IfStatement a -> b #

foldr1 :: (a -> a -> a) -> IfStatement a -> a #

foldl1 :: (a -> a -> a) -> IfStatement a -> a #

toList :: IfStatement a -> [a] #

null :: IfStatement a -> Bool #

length :: IfStatement a -> Int #

elem :: Eq a => a -> IfStatement a -> Bool #

maximum :: Ord a => IfStatement a -> a #

minimum :: Ord a => IfStatement a -> a #

sum :: Num a => IfStatement a -> a #

product :: Num a => IfStatement a -> a #

Traversable IfStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> IfStatement a -> f (IfStatement b) #

sequenceA :: Applicative f => IfStatement (f a) -> f (IfStatement a) #

mapM :: Monad m => (a -> m b) -> IfStatement a -> m (IfStatement b) #

sequence :: Monad m => IfStatement (m a) -> m (IfStatement a) #

SymbolMatching IfStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal IfStatement 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 (IfStatement a)

Eq a => Eq (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (IfStatement a) :: Type -> Type #

Methods

from :: IfStatement a -> Rep (IfStatement a) x #

to :: Rep (IfStatement a) x -> IfStatement a #

Generic1 IfStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 IfStatement :: k -> Type #

type Rep (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 IfStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

data GenericType a Source #

Instances
Functor GenericType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> GenericType a -> GenericType b #

(<$) :: a -> GenericType b -> GenericType a #

Foldable GenericType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => GenericType m -> m #

foldMap :: Monoid m => (a -> m) -> GenericType a -> m #

foldr :: (a -> b -> b) -> b -> GenericType a -> b #

foldr' :: (a -> b -> b) -> b -> GenericType a -> b #

foldl :: (b -> a -> b) -> b -> GenericType a -> b #

foldl' :: (b -> a -> b) -> b -> GenericType a -> b #

foldr1 :: (a -> a -> a) -> GenericType a -> a #

foldl1 :: (a -> a -> a) -> GenericType a -> a #

toList :: GenericType a -> [a] #

null :: GenericType a -> Bool #

length :: GenericType a -> Int #

elem :: Eq a => a -> GenericType a -> Bool #

maximum :: Ord a => GenericType a -> a #

minimum :: Ord a => GenericType a -> a #

sum :: Num a => GenericType a -> a #

product :: Num a => GenericType a -> a #

Traversable GenericType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> GenericType a -> f (GenericType b) #

sequenceA :: Applicative f => GenericType (f a) -> f (GenericType a) #

mapM :: Monad m => (a -> m b) -> GenericType a -> m (GenericType b) #

sequence :: Monad m => GenericType (m a) -> m (GenericType a) #

SymbolMatching GenericType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal GenericType 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 (GenericType a)

Eq a => Eq (GenericType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (GenericType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (GenericType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (GenericType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (GenericType a) :: Type -> Type #

Methods

from :: GenericType a -> Rep (GenericType a) x #

to :: Rep (GenericType a) x -> GenericType a #

Generic1 GenericType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 GenericType :: k -> Type #

type Rep (GenericType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (GenericType a) = D1 (MetaData "GenericType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "GenericType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((ScopedTypeIdentifier :+: (TypeArguments :+: TypeIdentifier)) a)))))
type Rep1 GenericType Source # 
Instance details

Defined in TreeSitter.Java.AST

data FormalParameters a Source #

Instances
Functor FormalParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> FormalParameters a -> FormalParameters b #

(<$) :: a -> FormalParameters b -> FormalParameters a #

Foldable FormalParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => FormalParameters m -> m #

foldMap :: Monoid m => (a -> m) -> FormalParameters a -> m #

foldr :: (a -> b -> b) -> b -> FormalParameters a -> b #

foldr' :: (a -> b -> b) -> b -> FormalParameters a -> b #

foldl :: (b -> a -> b) -> b -> FormalParameters a -> b #

foldl' :: (b -> a -> b) -> b -> FormalParameters a -> b #

foldr1 :: (a -> a -> a) -> FormalParameters a -> a #

foldl1 :: (a -> a -> a) -> FormalParameters a -> a #

toList :: FormalParameters a -> [a] #

null :: FormalParameters a -> Bool #

length :: FormalParameters a -> Int #

elem :: Eq a => a -> FormalParameters a -> Bool #

maximum :: Ord a => FormalParameters a -> a #

minimum :: Ord a => FormalParameters a -> a #

sum :: Num a => FormalParameters a -> a #

product :: Num a => FormalParameters a -> a #

Traversable FormalParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> FormalParameters a -> f (FormalParameters b) #

sequenceA :: Applicative f => FormalParameters (f a) -> f (FormalParameters a) #

mapM :: Monad m => (a -> m b) -> FormalParameters a -> m (FormalParameters b) #

sequence :: Monad m => FormalParameters (m a) -> m (FormalParameters a) #

SymbolMatching FormalParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal FormalParameters 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 (FormalParameters a)

Eq a => Eq (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (FormalParameters a) :: Type -> Type #

Generic1 FormalParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 FormalParameters :: k -> Type #

type Rep (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (FormalParameters a) = D1 (MetaData "FormalParameters" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "FormalParameters" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(FormalParameter :+: (ReceiverParameter :+: SpreadParameter)) a])))
type Rep1 FormalParameters Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 FormalParameters = D1 (MetaData "FormalParameters" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "FormalParameters" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 (FormalParameter :+: (ReceiverParameter :+: SpreadParameter)))))

data FormalParameter a Source #

Constructors

FormalParameter 
Instances
Functor FormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> FormalParameter a -> FormalParameter b #

(<$) :: a -> FormalParameter b -> FormalParameter a #

Foldable FormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => FormalParameter m -> m #

foldMap :: Monoid m => (a -> m) -> FormalParameter a -> m #

foldr :: (a -> b -> b) -> b -> FormalParameter a -> b #

foldr' :: (a -> b -> b) -> b -> FormalParameter a -> b #

foldl :: (b -> a -> b) -> b -> FormalParameter a -> b #

foldl' :: (b -> a -> b) -> b -> FormalParameter a -> b #

foldr1 :: (a -> a -> a) -> FormalParameter a -> a #

foldl1 :: (a -> a -> a) -> FormalParameter a -> a #

toList :: FormalParameter a -> [a] #

null :: FormalParameter a -> Bool #

length :: FormalParameter a -> Int #

elem :: Eq a => a -> FormalParameter a -> Bool #

maximum :: Ord a => FormalParameter a -> a #

minimum :: Ord a => FormalParameter a -> a #

sum :: Num a => FormalParameter a -> a #

product :: Num a => FormalParameter a -> a #

Traversable FormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> FormalParameter a -> f (FormalParameter b) #

sequenceA :: Applicative f => FormalParameter (f a) -> f (FormalParameter a) #

mapM :: Monad m => (a -> m b) -> FormalParameter a -> m (FormalParameter b) #

sequence :: Monad m => FormalParameter (m a) -> m (FormalParameter a) #

SymbolMatching FormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal FormalParameter 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 (FormalParameter a)

Eq a => Eq (FormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (FormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (FormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (FormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (FormalParameter a) :: Type -> Type #

Generic1 FormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 FormalParameter :: k -> Type #

type Rep (FormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 FormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

data ForStatement a Source #

Instances
Functor ForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ForStatement a -> ForStatement b #

(<$) :: a -> ForStatement b -> ForStatement a #

Foldable ForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ForStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ForStatement a -> m #

foldr :: (a -> b -> b) -> b -> ForStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ForStatement a -> b #

foldl :: (b -> a -> b) -> b -> ForStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ForStatement a -> b #

foldr1 :: (a -> a -> a) -> ForStatement a -> a #

foldl1 :: (a -> a -> a) -> ForStatement a -> a #

toList :: ForStatement a -> [a] #

null :: ForStatement a -> Bool #

length :: ForStatement a -> Int #

elem :: Eq a => a -> ForStatement a -> Bool #

maximum :: Ord a => ForStatement a -> a #

minimum :: Ord a => ForStatement a -> a #

sum :: Num a => ForStatement a -> a #

product :: Num a => ForStatement a -> a #

Traversable ForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ForStatement a -> f (ForStatement b) #

sequenceA :: Applicative f => ForStatement (f a) -> f (ForStatement a) #

mapM :: Monad m => (a -> m b) -> ForStatement a -> m (ForStatement b) #

sequence :: Monad m => ForStatement (m a) -> m (ForStatement a) #

SymbolMatching ForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ForStatement 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 (ForStatement a)

Eq a => Eq (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ForStatement a) :: Type -> Type #

Methods

from :: ForStatement a -> Rep (ForStatement a) x #

to :: Rep (ForStatement a) x -> ForStatement a #

Generic1 ForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ForStatement :: k -> Type #

type Rep (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ForStatement a) = D1 (MetaData "ForStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ForStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((Expression :+: (Statement :+: ForInit)) a)))))
type Rep1 ForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ForStatement = D1 (MetaData "ForStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ForStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: (Statement :+: ForInit)))))

data ForInit a Source #

Instances
Functor ForInit Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ForInit a -> ForInit b #

(<$) :: a -> ForInit b -> ForInit a #

Foldable ForInit Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ForInit m -> m #

foldMap :: Monoid m => (a -> m) -> ForInit a -> m #

foldr :: (a -> b -> b) -> b -> ForInit a -> b #

foldr' :: (a -> b -> b) -> b -> ForInit a -> b #

foldl :: (b -> a -> b) -> b -> ForInit a -> b #

foldl' :: (b -> a -> b) -> b -> ForInit a -> b #

foldr1 :: (a -> a -> a) -> ForInit a -> a #

foldl1 :: (a -> a -> a) -> ForInit a -> a #

toList :: ForInit a -> [a] #

null :: ForInit a -> Bool #

length :: ForInit a -> Int #

elem :: Eq a => a -> ForInit a -> Bool #

maximum :: Ord a => ForInit a -> a #

minimum :: Ord a => ForInit a -> a #

sum :: Num a => ForInit a -> a #

product :: Num a => ForInit a -> a #

Traversable ForInit Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ForInit a -> f (ForInit b) #

sequenceA :: Applicative f => ForInit (f a) -> f (ForInit a) #

mapM :: Monad m => (a -> m b) -> ForInit a -> m (ForInit b) #

sequence :: Monad m => ForInit (m a) -> m (ForInit a) #

SymbolMatching ForInit Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy ForInit -> Node -> Bool

showFailure :: Proxy ForInit -> Node -> String

Unmarshal ForInit 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 (ForInit a)

Eq a => Eq (ForInit a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: ForInit a -> ForInit a -> Bool #

(/=) :: ForInit a -> ForInit a -> Bool #

Ord a => Ord (ForInit a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: ForInit a -> ForInit a -> Ordering #

(<) :: ForInit a -> ForInit a -> Bool #

(<=) :: ForInit a -> ForInit a -> Bool #

(>) :: ForInit a -> ForInit a -> Bool #

(>=) :: ForInit a -> ForInit a -> Bool #

max :: ForInit a -> ForInit a -> ForInit a #

min :: ForInit a -> ForInit a -> ForInit a #

Show a => Show (ForInit a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> ForInit a -> ShowS #

show :: ForInit a -> String #

showList :: [ForInit a] -> ShowS #

Generic (ForInit a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ForInit a) :: Type -> Type #

Methods

from :: ForInit a -> Rep (ForInit a) x #

to :: Rep (ForInit a) x -> ForInit a #

Generic1 ForInit Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ForInit :: k -> Type #

Methods

from1 :: ForInit a -> Rep1 ForInit a #

to1 :: Rep1 ForInit a -> ForInit a #

type Rep (ForInit a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ForInit a) = D1 (MetaData "ForInit" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ForInit" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((Expression :+: LocalVariableDeclaration) a)))))
type Rep1 ForInit Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ForInit = D1 (MetaData "ForInit" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ForInit" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: LocalVariableDeclaration))))

data FloatingPointType a Source #

Constructors

FloatingPointType 

Fields

Instances
Functor FloatingPointType Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable FloatingPointType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => FloatingPointType m -> m #

foldMap :: Monoid m => (a -> m) -> FloatingPointType a -> m #

foldr :: (a -> b -> b) -> b -> FloatingPointType a -> b #

foldr' :: (a -> b -> b) -> b -> FloatingPointType a -> b #

foldl :: (b -> a -> b) -> b -> FloatingPointType a -> b #

foldl' :: (b -> a -> b) -> b -> FloatingPointType a -> b #

foldr1 :: (a -> a -> a) -> FloatingPointType a -> a #

foldl1 :: (a -> a -> a) -> FloatingPointType a -> a #

toList :: FloatingPointType a -> [a] #

null :: FloatingPointType a -> Bool #

length :: FloatingPointType a -> Int #

elem :: Eq a => a -> FloatingPointType a -> Bool #

maximum :: Ord a => FloatingPointType a -> a #

minimum :: Ord a => FloatingPointType a -> a #

sum :: Num a => FloatingPointType a -> a #

product :: Num a => FloatingPointType a -> a #

Traversable FloatingPointType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> FloatingPointType a -> f (FloatingPointType b) #

sequenceA :: Applicative f => FloatingPointType (f a) -> f (FloatingPointType a) #

mapM :: Monad m => (a -> m b) -> FloatingPointType a -> m (FloatingPointType b) #

sequence :: Monad m => FloatingPointType (m a) -> m (FloatingPointType a) #

SymbolMatching FloatingPointType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal FloatingPointType 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 (FloatingPointType a)

Eq a => Eq (FloatingPointType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (FloatingPointType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (FloatingPointType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (FloatingPointType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (FloatingPointType a) :: Type -> Type #

Generic1 FloatingPointType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 FloatingPointType :: k -> Type #

type Rep (FloatingPointType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (FloatingPointType a) = D1 (MetaData "FloatingPointType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "FloatingPointType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 FloatingPointType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 FloatingPointType = D1 (MetaData "FloatingPointType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "FloatingPointType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data FinallyClause a Source #

Constructors

FinallyClause 

Fields

Instances
Functor FinallyClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> FinallyClause a -> FinallyClause b #

(<$) :: a -> FinallyClause b -> FinallyClause a #

Foldable FinallyClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => FinallyClause m -> m #

foldMap :: Monoid m => (a -> m) -> FinallyClause a -> m #

foldr :: (a -> b -> b) -> b -> FinallyClause a -> b #

foldr' :: (a -> b -> b) -> b -> FinallyClause a -> b #

foldl :: (b -> a -> b) -> b -> FinallyClause a -> b #

foldl' :: (b -> a -> b) -> b -> FinallyClause a -> b #

foldr1 :: (a -> a -> a) -> FinallyClause a -> a #

foldl1 :: (a -> a -> a) -> FinallyClause a -> a #

toList :: FinallyClause a -> [a] #

null :: FinallyClause a -> Bool #

length :: FinallyClause a -> Int #

elem :: Eq a => a -> FinallyClause a -> Bool #

maximum :: Ord a => FinallyClause a -> a #

minimum :: Ord a => FinallyClause a -> a #

sum :: Num a => FinallyClause a -> a #

product :: Num a => FinallyClause a -> a #

Traversable FinallyClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> FinallyClause a -> f (FinallyClause b) #

sequenceA :: Applicative f => FinallyClause (f a) -> f (FinallyClause a) #

mapM :: Monad m => (a -> m b) -> FinallyClause a -> m (FinallyClause b) #

sequence :: Monad m => FinallyClause (m a) -> m (FinallyClause a) #

SymbolMatching FinallyClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal FinallyClause 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 (FinallyClause a)

Eq a => Eq (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (FinallyClause a) :: Type -> Type #

Generic1 FinallyClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 FinallyClause :: k -> Type #

type Rep (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (FinallyClause a) = D1 (MetaData "FinallyClause" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "FinallyClause" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block a))))
type Rep1 FinallyClause Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 FinallyClause = D1 (MetaData "FinallyClause" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "FinallyClause" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Block)))

data FieldDeclaration a Source #

Instances
Functor FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> FieldDeclaration a -> FieldDeclaration b #

(<$) :: a -> FieldDeclaration b -> FieldDeclaration a #

Foldable FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => FieldDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> FieldDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> FieldDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> FieldDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> FieldDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> FieldDeclaration a -> b #

foldr1 :: (a -> a -> a) -> FieldDeclaration a -> a #

foldl1 :: (a -> a -> a) -> FieldDeclaration a -> a #

toList :: FieldDeclaration a -> [a] #

null :: FieldDeclaration a -> Bool #

length :: FieldDeclaration a -> Int #

elem :: Eq a => a -> FieldDeclaration a -> Bool #

maximum :: Ord a => FieldDeclaration a -> a #

minimum :: Ord a => FieldDeclaration a -> a #

sum :: Num a => FieldDeclaration a -> a #

product :: Num a => FieldDeclaration a -> a #

Traversable FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> FieldDeclaration a -> f (FieldDeclaration b) #

sequenceA :: Applicative f => FieldDeclaration (f a) -> f (FieldDeclaration a) #

mapM :: Monad m => (a -> m b) -> FieldDeclaration a -> m (FieldDeclaration b) #

sequence :: Monad m => FieldDeclaration (m a) -> m (FieldDeclaration a) #

SymbolMatching FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal FieldDeclaration 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 (FieldDeclaration a)

Eq a => Eq (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (FieldDeclaration a) :: Type -> Type #

Generic1 FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 FieldDeclaration :: k -> Type #

type Rep (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data FieldAccess a Source #

Instances
Functor FieldAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> FieldAccess a -> FieldAccess b #

(<$) :: a -> FieldAccess b -> FieldAccess a #

Foldable FieldAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => FieldAccess m -> m #

foldMap :: Monoid m => (a -> m) -> FieldAccess a -> m #

foldr :: (a -> b -> b) -> b -> FieldAccess a -> b #

foldr' :: (a -> b -> b) -> b -> FieldAccess a -> b #

foldl :: (b -> a -> b) -> b -> FieldAccess a -> b #

foldl' :: (b -> a -> b) -> b -> FieldAccess a -> b #

foldr1 :: (a -> a -> a) -> FieldAccess a -> a #

foldl1 :: (a -> a -> a) -> FieldAccess a -> a #

toList :: FieldAccess a -> [a] #

null :: FieldAccess a -> Bool #

length :: FieldAccess a -> Int #

elem :: Eq a => a -> FieldAccess a -> Bool #

maximum :: Ord a => FieldAccess a -> a #

minimum :: Ord a => FieldAccess a -> a #

sum :: Num a => FieldAccess a -> a #

product :: Num a => FieldAccess a -> a #

Traversable FieldAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> FieldAccess a -> f (FieldAccess b) #

sequenceA :: Applicative f => FieldAccess (f a) -> f (FieldAccess a) #

mapM :: Monad m => (a -> m b) -> FieldAccess a -> m (FieldAccess b) #

sequence :: Monad m => FieldAccess (m a) -> m (FieldAccess a) #

SymbolMatching FieldAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal FieldAccess 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 (FieldAccess a)

Eq a => Eq (FieldAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (FieldAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (FieldAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (FieldAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (FieldAccess a) :: Type -> Type #

Methods

from :: FieldAccess a -> Rep (FieldAccess a) x #

to :: Rep (FieldAccess a) x -> FieldAccess a #

Generic1 FieldAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 FieldAccess :: k -> Type #

type Rep (FieldAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 FieldAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

data ExtendsInterfaces a Source #

Constructors

ExtendsInterfaces 

Fields

Instances
Functor ExtendsInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ExtendsInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ExtendsInterfaces m -> m #

foldMap :: Monoid m => (a -> m) -> ExtendsInterfaces a -> m #

foldr :: (a -> b -> b) -> b -> ExtendsInterfaces a -> b #

foldr' :: (a -> b -> b) -> b -> ExtendsInterfaces a -> b #

foldl :: (b -> a -> b) -> b -> ExtendsInterfaces a -> b #

foldl' :: (b -> a -> b) -> b -> ExtendsInterfaces a -> b #

foldr1 :: (a -> a -> a) -> ExtendsInterfaces a -> a #

foldl1 :: (a -> a -> a) -> ExtendsInterfaces a -> a #

toList :: ExtendsInterfaces a -> [a] #

null :: ExtendsInterfaces a -> Bool #

length :: ExtendsInterfaces a -> Int #

elem :: Eq a => a -> ExtendsInterfaces a -> Bool #

maximum :: Ord a => ExtendsInterfaces a -> a #

minimum :: Ord a => ExtendsInterfaces a -> a #

sum :: Num a => ExtendsInterfaces a -> a #

product :: Num a => ExtendsInterfaces a -> a #

Traversable ExtendsInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExtendsInterfaces a -> f (ExtendsInterfaces b) #

sequenceA :: Applicative f => ExtendsInterfaces (f a) -> f (ExtendsInterfaces a) #

mapM :: Monad m => (a -> m b) -> ExtendsInterfaces a -> m (ExtendsInterfaces b) #

sequence :: Monad m => ExtendsInterfaces (m a) -> m (ExtendsInterfaces a) #

SymbolMatching ExtendsInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ExtendsInterfaces 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 (ExtendsInterfaces a)

Eq a => Eq (ExtendsInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ExtendsInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ExtendsInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ExtendsInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ExtendsInterfaces a) :: Type -> Type #

Generic1 ExtendsInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ExtendsInterfaces :: k -> Type #

type Rep (ExtendsInterfaces a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ExtendsInterfaces a) = D1 (MetaData "ExtendsInterfaces" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ExtendsInterfaces" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (InterfaceTypeList a))))
type Rep1 ExtendsInterfaces Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ExtendsInterfaces = D1 (MetaData "ExtendsInterfaces" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ExtendsInterfaces" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 InterfaceTypeList)))

data ExpressionStatement a Source #

Constructors

ExpressionStatement 

Fields

Instances
Functor ExpressionStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ExpressionStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ExpressionStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ExpressionStatement a -> m #

foldr :: (a -> b -> b) -> b -> ExpressionStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ExpressionStatement a -> b #

foldl :: (b -> a -> b) -> b -> ExpressionStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ExpressionStatement a -> b #

foldr1 :: (a -> a -> a) -> ExpressionStatement a -> a #

foldl1 :: (a -> a -> a) -> ExpressionStatement a -> a #

toList :: ExpressionStatement a -> [a] #

null :: ExpressionStatement a -> Bool #

length :: ExpressionStatement a -> Int #

elem :: Eq a => a -> ExpressionStatement a -> Bool #

maximum :: Ord a => ExpressionStatement a -> a #

minimum :: Ord a => ExpressionStatement a -> a #

sum :: Num a => ExpressionStatement a -> a #

product :: Num a => ExpressionStatement a -> a #

Traversable ExpressionStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ExpressionStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ExpressionStatement 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 (ExpressionStatement a)

Eq a => Eq (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ExpressionStatement a) :: Type -> Type #

Generic1 ExpressionStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ExpressionStatement :: k -> Type #

type Rep (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ExpressionStatement a) = D1 (MetaData "ExpressionStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ExpressionStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a))))
type Rep1 ExpressionStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ExpressionStatement = D1 (MetaData "ExpressionStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ExpressionStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Expression)))

data ExplicitConstructorInvocation a Source #

Instances
Functor ExplicitConstructorInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ExplicitConstructorInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable ExplicitConstructorInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ExplicitConstructorInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ExplicitConstructorInvocation 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 (ExplicitConstructorInvocation a)

Eq a => Eq (ExplicitConstructorInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ExplicitConstructorInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ExplicitConstructorInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ExplicitConstructorInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ExplicitConstructorInvocation a) :: Type -> Type #

Generic1 ExplicitConstructorInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ExplicitConstructorInvocation :: k -> Type #

type Rep (ExplicitConstructorInvocation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ExplicitConstructorInvocation Source # 
Instance details

Defined in TreeSitter.Java.AST

data EnumDeclaration a Source #

Constructors

EnumDeclaration 

Fields

Instances
Functor EnumDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> EnumDeclaration a -> EnumDeclaration b #

(<$) :: a -> EnumDeclaration b -> EnumDeclaration a #

Foldable EnumDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => EnumDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> EnumDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> EnumDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> EnumDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> EnumDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> EnumDeclaration a -> b #

foldr1 :: (a -> a -> a) -> EnumDeclaration a -> a #

foldl1 :: (a -> a -> a) -> EnumDeclaration a -> a #

toList :: EnumDeclaration a -> [a] #

null :: EnumDeclaration a -> Bool #

length :: EnumDeclaration a -> Int #

elem :: Eq a => a -> EnumDeclaration a -> Bool #

maximum :: Ord a => EnumDeclaration a -> a #

minimum :: Ord a => EnumDeclaration a -> a #

sum :: Num a => EnumDeclaration a -> a #

product :: Num a => EnumDeclaration a -> a #

Traversable EnumDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> EnumDeclaration a -> f (EnumDeclaration b) #

sequenceA :: Applicative f => EnumDeclaration (f a) -> f (EnumDeclaration a) #

mapM :: Monad m => (a -> m b) -> EnumDeclaration a -> m (EnumDeclaration b) #

sequence :: Monad m => EnumDeclaration (m a) -> m (EnumDeclaration a) #

SymbolMatching EnumDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal EnumDeclaration 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 (EnumDeclaration a)

Eq a => Eq (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (EnumDeclaration a) :: Type -> Type #

Generic1 EnumDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 EnumDeclaration :: k -> Type #

type Rep (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 EnumDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data EnumConstant a Source #

Constructors

EnumConstant 

Fields

Instances
Functor EnumConstant Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> EnumConstant a -> EnumConstant b #

(<$) :: a -> EnumConstant b -> EnumConstant a #

Foldable EnumConstant Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => EnumConstant m -> m #

foldMap :: Monoid m => (a -> m) -> EnumConstant a -> m #

foldr :: (a -> b -> b) -> b -> EnumConstant a -> b #

foldr' :: (a -> b -> b) -> b -> EnumConstant a -> b #

foldl :: (b -> a -> b) -> b -> EnumConstant a -> b #

foldl' :: (b -> a -> b) -> b -> EnumConstant a -> b #

foldr1 :: (a -> a -> a) -> EnumConstant a -> a #

foldl1 :: (a -> a -> a) -> EnumConstant a -> a #

toList :: EnumConstant a -> [a] #

null :: EnumConstant a -> Bool #

length :: EnumConstant a -> Int #

elem :: Eq a => a -> EnumConstant a -> Bool #

maximum :: Ord a => EnumConstant a -> a #

minimum :: Ord a => EnumConstant a -> a #

sum :: Num a => EnumConstant a -> a #

product :: Num a => EnumConstant a -> a #

Traversable EnumConstant Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> EnumConstant a -> f (EnumConstant b) #

sequenceA :: Applicative f => EnumConstant (f a) -> f (EnumConstant a) #

mapM :: Monad m => (a -> m b) -> EnumConstant a -> m (EnumConstant b) #

sequence :: Monad m => EnumConstant (m a) -> m (EnumConstant a) #

SymbolMatching EnumConstant Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal EnumConstant 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 (EnumConstant a)

Eq a => Eq (EnumConstant a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (EnumConstant a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (EnumConstant a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (EnumConstant a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (EnumConstant a) :: Type -> Type #

Methods

from :: EnumConstant a -> Rep (EnumConstant a) x #

to :: Rep (EnumConstant a) x -> EnumConstant a #

Generic1 EnumConstant Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 EnumConstant :: k -> Type #

type Rep (EnumConstant a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 EnumConstant Source # 
Instance details

Defined in TreeSitter.Java.AST

data EnumBodyDeclarations a Source #

Instances
Functor EnumBodyDeclarations Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable EnumBodyDeclarations Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => EnumBodyDeclarations m -> m #

foldMap :: Monoid m => (a -> m) -> EnumBodyDeclarations a -> m #

foldr :: (a -> b -> b) -> b -> EnumBodyDeclarations a -> b #

foldr' :: (a -> b -> b) -> b -> EnumBodyDeclarations a -> b #

foldl :: (b -> a -> b) -> b -> EnumBodyDeclarations a -> b #

foldl' :: (b -> a -> b) -> b -> EnumBodyDeclarations a -> b #

foldr1 :: (a -> a -> a) -> EnumBodyDeclarations a -> a #

foldl1 :: (a -> a -> a) -> EnumBodyDeclarations a -> a #

toList :: EnumBodyDeclarations a -> [a] #

null :: EnumBodyDeclarations a -> Bool #

length :: EnumBodyDeclarations a -> Int #

elem :: Eq a => a -> EnumBodyDeclarations a -> Bool #

maximum :: Ord a => EnumBodyDeclarations a -> a #

minimum :: Ord a => EnumBodyDeclarations a -> a #

sum :: Num a => EnumBodyDeclarations a -> a #

product :: Num a => EnumBodyDeclarations a -> a #

Traversable EnumBodyDeclarations Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching EnumBodyDeclarations Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal EnumBodyDeclarations 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 (EnumBodyDeclarations a)

Eq a => Eq (EnumBodyDeclarations a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (EnumBodyDeclarations a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (EnumBodyDeclarations a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (EnumBodyDeclarations a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (EnumBodyDeclarations a) :: Type -> Type #

Generic1 EnumBodyDeclarations Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 EnumBodyDeclarations :: k -> Type #

type Rep (EnumBodyDeclarations a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 EnumBodyDeclarations Source # 
Instance details

Defined in TreeSitter.Java.AST

data EnumBody a Source #

Constructors

EnumBody 
Instances
Functor EnumBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> EnumBody a -> EnumBody b #

(<$) :: a -> EnumBody b -> EnumBody a #

Foldable EnumBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => EnumBody m -> m #

foldMap :: Monoid m => (a -> m) -> EnumBody a -> m #

foldr :: (a -> b -> b) -> b -> EnumBody a -> b #

foldr' :: (a -> b -> b) -> b -> EnumBody a -> b #

foldl :: (b -> a -> b) -> b -> EnumBody a -> b #

foldl' :: (b -> a -> b) -> b -> EnumBody a -> b #

foldr1 :: (a -> a -> a) -> EnumBody a -> a #

foldl1 :: (a -> a -> a) -> EnumBody a -> a #

toList :: EnumBody a -> [a] #

null :: EnumBody a -> Bool #

length :: EnumBody a -> Int #

elem :: Eq a => a -> EnumBody a -> Bool #

maximum :: Ord a => EnumBody a -> a #

minimum :: Ord a => EnumBody a -> a #

sum :: Num a => EnumBody a -> a #

product :: Num a => EnumBody a -> a #

Traversable EnumBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> EnumBody a -> f (EnumBody b) #

sequenceA :: Applicative f => EnumBody (f a) -> f (EnumBody a) #

mapM :: Monad m => (a -> m b) -> EnumBody a -> m (EnumBody b) #

sequence :: Monad m => EnumBody (m a) -> m (EnumBody a) #

SymbolMatching EnumBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy EnumBody -> Node -> Bool

showFailure :: Proxy EnumBody -> Node -> String

Unmarshal EnumBody 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 (EnumBody a)

Eq a => Eq (EnumBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: EnumBody a -> EnumBody a -> Bool #

(/=) :: EnumBody a -> EnumBody a -> Bool #

Ord a => Ord (EnumBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: EnumBody a -> EnumBody a -> Ordering #

(<) :: EnumBody a -> EnumBody a -> Bool #

(<=) :: EnumBody a -> EnumBody a -> Bool #

(>) :: EnumBody a -> EnumBody a -> Bool #

(>=) :: EnumBody a -> EnumBody a -> Bool #

max :: EnumBody a -> EnumBody a -> EnumBody a #

min :: EnumBody a -> EnumBody a -> EnumBody a #

Show a => Show (EnumBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> EnumBody a -> ShowS #

show :: EnumBody a -> String #

showList :: [EnumBody a] -> ShowS #

Generic (EnumBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (EnumBody a) :: Type -> Type #

Methods

from :: EnumBody a -> Rep (EnumBody a) x #

to :: Rep (EnumBody a) x -> EnumBody a #

Generic1 EnumBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 EnumBody :: k -> Type #

Methods

from1 :: EnumBody a -> Rep1 EnumBody a #

to1 :: Rep1 EnumBody a -> EnumBody a #

type Rep (EnumBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (EnumBody a) = D1 (MetaData "EnumBody" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "EnumBody" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(EnumBodyDeclarations :+: EnumConstant) a])))
type Rep1 EnumBody Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 EnumBody = D1 (MetaData "EnumBody" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "EnumBody" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 (EnumBodyDeclarations :+: EnumConstant))))

data EnhancedForStatement a Source #

Constructors

EnhancedForStatement 

Fields

Instances
Functor EnhancedForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable EnhancedForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => EnhancedForStatement m -> m #

foldMap :: Monoid m => (a -> m) -> EnhancedForStatement a -> m #

foldr :: (a -> b -> b) -> b -> EnhancedForStatement a -> b #

foldr' :: (a -> b -> b) -> b -> EnhancedForStatement a -> b #

foldl :: (b -> a -> b) -> b -> EnhancedForStatement a -> b #

foldl' :: (b -> a -> b) -> b -> EnhancedForStatement a -> b #

foldr1 :: (a -> a -> a) -> EnhancedForStatement a -> a #

foldl1 :: (a -> a -> a) -> EnhancedForStatement a -> a #

toList :: EnhancedForStatement a -> [a] #

null :: EnhancedForStatement a -> Bool #

length :: EnhancedForStatement a -> Int #

elem :: Eq a => a -> EnhancedForStatement a -> Bool #

maximum :: Ord a => EnhancedForStatement a -> a #

minimum :: Ord a => EnhancedForStatement a -> a #

sum :: Num a => EnhancedForStatement a -> a #

product :: Num a => EnhancedForStatement a -> a #

Traversable EnhancedForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching EnhancedForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal EnhancedForStatement 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 (EnhancedForStatement a)

Eq a => Eq (EnhancedForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (EnhancedForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (EnhancedForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (EnhancedForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (EnhancedForStatement a) :: Type -> Type #

Generic1 EnhancedForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 EnhancedForStatement :: k -> Type #

type Rep (EnhancedForStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 EnhancedForStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

data ElementValuePair a Source #

Instances
Functor ElementValuePair Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ElementValuePair a -> ElementValuePair b #

(<$) :: a -> ElementValuePair b -> ElementValuePair a #

Foldable ElementValuePair Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ElementValuePair m -> m #

foldMap :: Monoid m => (a -> m) -> ElementValuePair a -> m #

foldr :: (a -> b -> b) -> b -> ElementValuePair a -> b #

foldr' :: (a -> b -> b) -> b -> ElementValuePair a -> b #

foldl :: (b -> a -> b) -> b -> ElementValuePair a -> b #

foldl' :: (b -> a -> b) -> b -> ElementValuePair a -> b #

foldr1 :: (a -> a -> a) -> ElementValuePair a -> a #

foldl1 :: (a -> a -> a) -> ElementValuePair a -> a #

toList :: ElementValuePair a -> [a] #

null :: ElementValuePair a -> Bool #

length :: ElementValuePair a -> Int #

elem :: Eq a => a -> ElementValuePair a -> Bool #

maximum :: Ord a => ElementValuePair a -> a #

minimum :: Ord a => ElementValuePair a -> a #

sum :: Num a => ElementValuePair a -> a #

product :: Num a => ElementValuePair a -> a #

Traversable ElementValuePair Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ElementValuePair a -> f (ElementValuePair b) #

sequenceA :: Applicative f => ElementValuePair (f a) -> f (ElementValuePair a) #

mapM :: Monad m => (a -> m b) -> ElementValuePair a -> m (ElementValuePair b) #

sequence :: Monad m => ElementValuePair (m a) -> m (ElementValuePair a) #

SymbolMatching ElementValuePair Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ElementValuePair 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 (ElementValuePair a)

Eq a => Eq (ElementValuePair a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ElementValuePair a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ElementValuePair a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ElementValuePair a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ElementValuePair a) :: Type -> Type #

Generic1 ElementValuePair Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ElementValuePair :: k -> Type #

type Rep (ElementValuePair a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ElementValuePair Source # 
Instance details

Defined in TreeSitter.Java.AST

data ElementValueArrayInitializer a Source #

Instances
Functor ElementValueArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ElementValueArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable ElementValueArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ElementValueArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ElementValueArrayInitializer 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 (ElementValueArrayInitializer a)

Eq a => Eq (ElementValueArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ElementValueArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ElementValueArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ElementValueArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ElementValueArrayInitializer a) :: Type -> Type #

Generic1 ElementValueArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ElementValueArrayInitializer :: k -> Type #

type Rep (ElementValueArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ElementValueArrayInitializer a) = D1 (MetaData "ElementValueArrayInitializer" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ElementValueArrayInitializer" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [((Expression :+: Annotation) :+: (ElementValueArrayInitializer :+: MarkerAnnotation)) a])))
type Rep1 ElementValueArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ElementValueArrayInitializer = D1 (MetaData "ElementValueArrayInitializer" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ElementValueArrayInitializer" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 ((Expression :+: Annotation) :+: (ElementValueArrayInitializer :+: MarkerAnnotation)))))

data DoStatement a Source #

Constructors

DoStatement 
Instances
Functor DoStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> DoStatement a -> DoStatement b #

(<$) :: a -> DoStatement b -> DoStatement a #

Foldable DoStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => DoStatement m -> m #

foldMap :: Monoid m => (a -> m) -> DoStatement a -> m #

foldr :: (a -> b -> b) -> b -> DoStatement a -> b #

foldr' :: (a -> b -> b) -> b -> DoStatement a -> b #

foldl :: (b -> a -> b) -> b -> DoStatement a -> b #

foldl' :: (b -> a -> b) -> b -> DoStatement a -> b #

foldr1 :: (a -> a -> a) -> DoStatement a -> a #

foldl1 :: (a -> a -> a) -> DoStatement a -> a #

toList :: DoStatement a -> [a] #

null :: DoStatement a -> Bool #

length :: DoStatement a -> Int #

elem :: Eq a => a -> DoStatement a -> Bool #

maximum :: Ord a => DoStatement a -> a #

minimum :: Ord a => DoStatement a -> a #

sum :: Num a => DoStatement a -> a #

product :: Num a => DoStatement a -> a #

Traversable DoStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> DoStatement a -> f (DoStatement b) #

sequenceA :: Applicative f => DoStatement (f a) -> f (DoStatement a) #

mapM :: Monad m => (a -> m b) -> DoStatement a -> m (DoStatement b) #

sequence :: Monad m => DoStatement (m a) -> m (DoStatement a) #

SymbolMatching DoStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal DoStatement 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 (DoStatement a)

Eq a => Eq (DoStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (DoStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (DoStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (DoStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (DoStatement a) :: Type -> Type #

Methods

from :: DoStatement a -> Rep (DoStatement a) x #

to :: Rep (DoStatement a) x -> DoStatement a #

Generic1 DoStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 DoStatement :: k -> Type #

type Rep (DoStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (DoStatement a) = D1 (MetaData "DoStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "DoStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((Expression :+: Statement) a)))))
type Rep1 DoStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 DoStatement = D1 (MetaData "DoStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "DoStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: Statement))))

data DimensionsExpr a Source #

Instances
Functor DimensionsExpr Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> DimensionsExpr a -> DimensionsExpr b #

(<$) :: a -> DimensionsExpr b -> DimensionsExpr a #

Foldable DimensionsExpr Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => DimensionsExpr m -> m #

foldMap :: Monoid m => (a -> m) -> DimensionsExpr a -> m #

foldr :: (a -> b -> b) -> b -> DimensionsExpr a -> b #

foldr' :: (a -> b -> b) -> b -> DimensionsExpr a -> b #

foldl :: (b -> a -> b) -> b -> DimensionsExpr a -> b #

foldl' :: (b -> a -> b) -> b -> DimensionsExpr a -> b #

foldr1 :: (a -> a -> a) -> DimensionsExpr a -> a #

foldl1 :: (a -> a -> a) -> DimensionsExpr a -> a #

toList :: DimensionsExpr a -> [a] #

null :: DimensionsExpr a -> Bool #

length :: DimensionsExpr a -> Int #

elem :: Eq a => a -> DimensionsExpr a -> Bool #

maximum :: Ord a => DimensionsExpr a -> a #

minimum :: Ord a => DimensionsExpr a -> a #

sum :: Num a => DimensionsExpr a -> a #

product :: Num a => DimensionsExpr a -> a #

Traversable DimensionsExpr Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> DimensionsExpr a -> f (DimensionsExpr b) #

sequenceA :: Applicative f => DimensionsExpr (f a) -> f (DimensionsExpr a) #

mapM :: Monad m => (a -> m b) -> DimensionsExpr a -> m (DimensionsExpr b) #

sequence :: Monad m => DimensionsExpr (m a) -> m (DimensionsExpr a) #

SymbolMatching DimensionsExpr Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal DimensionsExpr 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 (DimensionsExpr a)

Eq a => Eq (DimensionsExpr a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (DimensionsExpr a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (DimensionsExpr a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (DimensionsExpr a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (DimensionsExpr a) :: Type -> Type #

Generic1 DimensionsExpr Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 DimensionsExpr :: k -> Type #

type Rep (DimensionsExpr a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (DimensionsExpr a) = D1 (MetaData "DimensionsExpr" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "DimensionsExpr" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((Expression :+: (Annotation :+: MarkerAnnotation)) a)))))
type Rep1 DimensionsExpr Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 DimensionsExpr = D1 (MetaData "DimensionsExpr" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "DimensionsExpr" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: (Annotation :+: MarkerAnnotation)))))

data Dimensions a Source #

Constructors

Dimensions 
Instances
Functor Dimensions Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Dimensions a -> Dimensions b #

(<$) :: a -> Dimensions b -> Dimensions a #

Foldable Dimensions Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Dimensions m -> m #

foldMap :: Monoid m => (a -> m) -> Dimensions a -> m #

foldr :: (a -> b -> b) -> b -> Dimensions a -> b #

foldr' :: (a -> b -> b) -> b -> Dimensions a -> b #

foldl :: (b -> a -> b) -> b -> Dimensions a -> b #

foldl' :: (b -> a -> b) -> b -> Dimensions a -> b #

foldr1 :: (a -> a -> a) -> Dimensions a -> a #

foldl1 :: (a -> a -> a) -> Dimensions a -> a #

toList :: Dimensions a -> [a] #

null :: Dimensions a -> Bool #

length :: Dimensions a -> Int #

elem :: Eq a => a -> Dimensions a -> Bool #

maximum :: Ord a => Dimensions a -> a #

minimum :: Ord a => Dimensions a -> a #

sum :: Num a => Dimensions a -> a #

product :: Num a => Dimensions a -> a #

Traversable Dimensions Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Dimensions a -> f (Dimensions b) #

sequenceA :: Applicative f => Dimensions (f a) -> f (Dimensions a) #

mapM :: Monad m => (a -> m b) -> Dimensions a -> m (Dimensions b) #

sequence :: Monad m => Dimensions (m a) -> m (Dimensions a) #

SymbolMatching Dimensions Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal Dimensions 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 (Dimensions a)

Eq a => Eq (Dimensions a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Dimensions a -> Dimensions a -> Bool #

(/=) :: Dimensions a -> Dimensions a -> Bool #

Ord a => Ord (Dimensions a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (Dimensions a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (Dimensions a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Dimensions a) :: Type -> Type #

Methods

from :: Dimensions a -> Rep (Dimensions a) x #

to :: Rep (Dimensions a) x -> Dimensions a #

Generic1 Dimensions Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Dimensions :: k -> Type #

type Rep (Dimensions a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Dimensions a) = D1 (MetaData "Dimensions" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "Dimensions" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Annotation :+: MarkerAnnotation) a])))
type Rep1 Dimensions Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Dimensions = D1 (MetaData "Dimensions" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "Dimensions" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 (Annotation :+: MarkerAnnotation))))

data ContinueStatement a Source #

Constructors

ContinueStatement 

Fields

Instances
Functor ContinueStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ContinueStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ContinueStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ContinueStatement a -> m #

foldr :: (a -> b -> b) -> b -> ContinueStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ContinueStatement a -> b #

foldl :: (b -> a -> b) -> b -> ContinueStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ContinueStatement a -> b #

foldr1 :: (a -> a -> a) -> ContinueStatement a -> a #

foldl1 :: (a -> a -> a) -> ContinueStatement a -> a #

toList :: ContinueStatement a -> [a] #

null :: ContinueStatement a -> Bool #

length :: ContinueStatement a -> Int #

elem :: Eq a => a -> ContinueStatement a -> Bool #

maximum :: Ord a => ContinueStatement a -> a #

minimum :: Ord a => ContinueStatement a -> a #

sum :: Num a => ContinueStatement a -> a #

product :: Num a => ContinueStatement a -> a #

Traversable ContinueStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ContinueStatement a -> f (ContinueStatement b) #

sequenceA :: Applicative f => ContinueStatement (f a) -> f (ContinueStatement a) #

mapM :: Monad m => (a -> m b) -> ContinueStatement a -> m (ContinueStatement b) #

sequence :: Monad m => ContinueStatement (m a) -> m (ContinueStatement a) #

SymbolMatching ContinueStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ContinueStatement 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 (ContinueStatement a)

Eq a => Eq (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ContinueStatement a) :: Type -> Type #

Generic1 ContinueStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ContinueStatement :: k -> Type #

type Rep (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ContinueStatement a) = D1 (MetaData "ContinueStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ContinueStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Identifier a)))))
type Rep1 ContinueStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ContinueStatement = D1 (MetaData "ContinueStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ContinueStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Maybe :.: Rec1 Identifier)))

data ConstructorDeclaration a Source #

Instances
Functor ConstructorDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ConstructorDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ConstructorDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ConstructorDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ConstructorDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ConstructorDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ConstructorDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ConstructorDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ConstructorDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ConstructorDeclaration a -> a #

toList :: ConstructorDeclaration a -> [a] #

null :: ConstructorDeclaration a -> Bool #

length :: ConstructorDeclaration a -> Int #

elem :: Eq a => a -> ConstructorDeclaration a -> Bool #

maximum :: Ord a => ConstructorDeclaration a -> a #

minimum :: Ord a => ConstructorDeclaration a -> a #

sum :: Num a => ConstructorDeclaration a -> a #

product :: Num a => ConstructorDeclaration a -> a #

Traversable ConstructorDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ConstructorDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ConstructorDeclaration 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 (ConstructorDeclaration a)

Eq a => Eq (ConstructorDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ConstructorDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ConstructorDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ConstructorDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ConstructorDeclaration a) :: Type -> Type #

Generic1 ConstructorDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ConstructorDeclaration :: k -> Type #

type Rep (ConstructorDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ConstructorDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data ConstructorBody a Source #

Instances
Functor ConstructorBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ConstructorBody a -> ConstructorBody b #

(<$) :: a -> ConstructorBody b -> ConstructorBody a #

Foldable ConstructorBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ConstructorBody m -> m #

foldMap :: Monoid m => (a -> m) -> ConstructorBody a -> m #

foldr :: (a -> b -> b) -> b -> ConstructorBody a -> b #

foldr' :: (a -> b -> b) -> b -> ConstructorBody a -> b #

foldl :: (b -> a -> b) -> b -> ConstructorBody a -> b #

foldl' :: (b -> a -> b) -> b -> ConstructorBody a -> b #

foldr1 :: (a -> a -> a) -> ConstructorBody a -> a #

foldl1 :: (a -> a -> a) -> ConstructorBody a -> a #

toList :: ConstructorBody a -> [a] #

null :: ConstructorBody a -> Bool #

length :: ConstructorBody a -> Int #

elem :: Eq a => a -> ConstructorBody a -> Bool #

maximum :: Ord a => ConstructorBody a -> a #

minimum :: Ord a => ConstructorBody a -> a #

sum :: Num a => ConstructorBody a -> a #

product :: Num a => ConstructorBody a -> a #

Traversable ConstructorBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ConstructorBody a -> f (ConstructorBody b) #

sequenceA :: Applicative f => ConstructorBody (f a) -> f (ConstructorBody a) #

mapM :: Monad m => (a -> m b) -> ConstructorBody a -> m (ConstructorBody b) #

sequence :: Monad m => ConstructorBody (m a) -> m (ConstructorBody a) #

SymbolMatching ConstructorBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ConstructorBody 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 (ConstructorBody a)

Eq a => Eq (ConstructorBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ConstructorBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ConstructorBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ConstructorBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ConstructorBody a) :: Type -> Type #

Generic1 ConstructorBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ConstructorBody :: k -> Type #

type Rep (ConstructorBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ConstructorBody a) = D1 (MetaData "ConstructorBody" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ConstructorBody" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Statement :+: ExplicitConstructorInvocation) a])))
type Rep1 ConstructorBody Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ConstructorBody = D1 (MetaData "ConstructorBody" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ConstructorBody" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 (Statement :+: ExplicitConstructorInvocation))))

data ConstantDeclaration a Source #

Instances
Functor ConstantDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ConstantDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ConstantDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ConstantDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ConstantDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ConstantDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ConstantDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ConstantDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ConstantDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ConstantDeclaration a -> a #

toList :: ConstantDeclaration a -> [a] #

null :: ConstantDeclaration a -> Bool #

length :: ConstantDeclaration a -> Int #

elem :: Eq a => a -> ConstantDeclaration a -> Bool #

maximum :: Ord a => ConstantDeclaration a -> a #

minimum :: Ord a => ConstantDeclaration a -> a #

sum :: Num a => ConstantDeclaration a -> a #

product :: Num a => ConstantDeclaration a -> a #

Traversable ConstantDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ConstantDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ConstantDeclaration 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 (ConstantDeclaration a)

Eq a => Eq (ConstantDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ConstantDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ConstantDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ConstantDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ConstantDeclaration a) :: Type -> Type #

Generic1 ConstantDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ConstantDeclaration :: k -> Type #

type Rep (ConstantDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ConstantDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data ClassLiteral a Source #

Instances
Functor ClassLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ClassLiteral a -> ClassLiteral b #

(<$) :: a -> ClassLiteral b -> ClassLiteral a #

Foldable ClassLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ClassLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> ClassLiteral a -> m #

foldr :: (a -> b -> b) -> b -> ClassLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> ClassLiteral a -> b #

foldl :: (b -> a -> b) -> b -> ClassLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> ClassLiteral a -> b #

foldr1 :: (a -> a -> a) -> ClassLiteral a -> a #

foldl1 :: (a -> a -> a) -> ClassLiteral a -> a #

toList :: ClassLiteral a -> [a] #

null :: ClassLiteral a -> Bool #

length :: ClassLiteral a -> Int #

elem :: Eq a => a -> ClassLiteral a -> Bool #

maximum :: Ord a => ClassLiteral a -> a #

minimum :: Ord a => ClassLiteral a -> a #

sum :: Num a => ClassLiteral a -> a #

product :: Num a => ClassLiteral a -> a #

Traversable ClassLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ClassLiteral a -> f (ClassLiteral b) #

sequenceA :: Applicative f => ClassLiteral (f a) -> f (ClassLiteral a) #

mapM :: Monad m => (a -> m b) -> ClassLiteral a -> m (ClassLiteral b) #

sequence :: Monad m => ClassLiteral (m a) -> m (ClassLiteral a) #

SymbolMatching ClassLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ClassLiteral 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 (ClassLiteral a)

Eq a => Eq (ClassLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ClassLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ClassLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ClassLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ClassLiteral a) :: Type -> Type #

Methods

from :: ClassLiteral a -> Rep (ClassLiteral a) x #

to :: Rep (ClassLiteral a) x -> ClassLiteral a #

Generic1 ClassLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ClassLiteral :: k -> Type #

type Rep (ClassLiteral a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ClassLiteral a) = D1 (MetaData "ClassLiteral" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ClassLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (((BooleanType :+: (FloatingPointType :+: Identifier)) :+: (IntegralType :+: (ScopedIdentifier :+: VoidType))) a))))
type Rep1 ClassLiteral Source # 
Instance details

Defined in TreeSitter.Java.AST

data ClassDeclaration a Source #

Instances
Functor ClassDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ClassDeclaration a -> ClassDeclaration b #

(<$) :: a -> ClassDeclaration b -> ClassDeclaration a #

Foldable ClassDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ClassDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ClassDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ClassDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ClassDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ClassDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ClassDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ClassDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ClassDeclaration a -> a #

toList :: ClassDeclaration a -> [a] #

null :: ClassDeclaration a -> Bool #

length :: ClassDeclaration a -> Int #

elem :: Eq a => a -> ClassDeclaration a -> Bool #

maximum :: Ord a => ClassDeclaration a -> a #

minimum :: Ord a => ClassDeclaration a -> a #

sum :: Num a => ClassDeclaration a -> a #

product :: Num a => ClassDeclaration a -> a #

Traversable ClassDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ClassDeclaration a -> f (ClassDeclaration b) #

sequenceA :: Applicative f => ClassDeclaration (f a) -> f (ClassDeclaration a) #

mapM :: Monad m => (a -> m b) -> ClassDeclaration a -> m (ClassDeclaration b) #

sequence :: Monad m => ClassDeclaration (m a) -> m (ClassDeclaration a) #

SymbolMatching ClassDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ClassDeclaration 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 (ClassDeclaration a)

Eq a => Eq (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ClassDeclaration a) :: Type -> Type #

Generic1 ClassDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ClassDeclaration :: k -> Type #

type Rep (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ClassDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data ClassBody a Source #

Instances
Functor ClassBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ClassBody a -> ClassBody b #

(<$) :: a -> ClassBody b -> ClassBody a #

Foldable ClassBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ClassBody m -> m #

foldMap :: Monoid m => (a -> m) -> ClassBody a -> m #

foldr :: (a -> b -> b) -> b -> ClassBody a -> b #

foldr' :: (a -> b -> b) -> b -> ClassBody a -> b #

foldl :: (b -> a -> b) -> b -> ClassBody a -> b #

foldl' :: (b -> a -> b) -> b -> ClassBody a -> b #

foldr1 :: (a -> a -> a) -> ClassBody a -> a #

foldl1 :: (a -> a -> a) -> ClassBody a -> a #

toList :: ClassBody a -> [a] #

null :: ClassBody a -> Bool #

length :: ClassBody a -> Int #

elem :: Eq a => a -> ClassBody a -> Bool #

maximum :: Ord a => ClassBody a -> a #

minimum :: Ord a => ClassBody a -> a #

sum :: Num a => ClassBody a -> a #

product :: Num a => ClassBody a -> a #

Traversable ClassBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ClassBody a -> f (ClassBody b) #

sequenceA :: Applicative f => ClassBody (f a) -> f (ClassBody a) #

mapM :: Monad m => (a -> m b) -> ClassBody a -> m (ClassBody b) #

sequence :: Monad m => ClassBody (m a) -> m (ClassBody a) #

SymbolMatching ClassBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy ClassBody -> Node -> Bool

showFailure :: Proxy ClassBody -> Node -> String

Unmarshal ClassBody 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 (ClassBody a)

Eq a => Eq (ClassBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: ClassBody a -> ClassBody a -> Bool #

(/=) :: ClassBody a -> ClassBody a -> Bool #

Ord a => Ord (ClassBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ClassBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ClassBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ClassBody a) :: Type -> Type #

Methods

from :: ClassBody a -> Rep (ClassBody a) x #

to :: Rep (ClassBody a) x -> ClassBody a #

Generic1 ClassBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ClassBody :: k -> Type #

type Rep (ClassBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ClassBody Source # 
Instance details

Defined in TreeSitter.Java.AST

data CatchType a Source #

Constructors

CatchType 

Fields

Instances
Functor CatchType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> CatchType a -> CatchType b #

(<$) :: a -> CatchType b -> CatchType a #

Foldable CatchType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => CatchType m -> m #

foldMap :: Monoid m => (a -> m) -> CatchType a -> m #

foldr :: (a -> b -> b) -> b -> CatchType a -> b #

foldr' :: (a -> b -> b) -> b -> CatchType a -> b #

foldl :: (b -> a -> b) -> b -> CatchType a -> b #

foldl' :: (b -> a -> b) -> b -> CatchType a -> b #

foldr1 :: (a -> a -> a) -> CatchType a -> a #

foldl1 :: (a -> a -> a) -> CatchType a -> a #

toList :: CatchType a -> [a] #

null :: CatchType a -> Bool #

length :: CatchType a -> Int #

elem :: Eq a => a -> CatchType a -> Bool #

maximum :: Ord a => CatchType a -> a #

minimum :: Ord a => CatchType a -> a #

sum :: Num a => CatchType a -> a #

product :: Num a => CatchType a -> a #

Traversable CatchType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> CatchType a -> f (CatchType b) #

sequenceA :: Applicative f => CatchType (f a) -> f (CatchType a) #

mapM :: Monad m => (a -> m b) -> CatchType a -> m (CatchType b) #

sequence :: Monad m => CatchType (m a) -> m (CatchType a) #

SymbolMatching CatchType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy CatchType -> Node -> Bool

showFailure :: Proxy CatchType -> Node -> String

Unmarshal CatchType 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 (CatchType a)

Eq a => Eq (CatchType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: CatchType a -> CatchType a -> Bool #

(/=) :: CatchType a -> CatchType a -> Bool #

Ord a => Ord (CatchType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (CatchType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (CatchType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (CatchType a) :: Type -> Type #

Methods

from :: CatchType a -> Rep (CatchType a) x #

to :: Rep (CatchType a) x -> CatchType a #

Generic1 CatchType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 CatchType :: k -> Type #

type Rep (CatchType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (CatchType a) = D1 (MetaData "CatchType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "CatchType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (UnannotatedType a)))))
type Rep1 CatchType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 CatchType = D1 (MetaData "CatchType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "CatchType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 UnannotatedType)))

data CatchFormalParameter a Source #

Instances
Functor CatchFormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable CatchFormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => CatchFormalParameter m -> m #

foldMap :: Monoid m => (a -> m) -> CatchFormalParameter a -> m #

foldr :: (a -> b -> b) -> b -> CatchFormalParameter a -> b #

foldr' :: (a -> b -> b) -> b -> CatchFormalParameter a -> b #

foldl :: (b -> a -> b) -> b -> CatchFormalParameter a -> b #

foldl' :: (b -> a -> b) -> b -> CatchFormalParameter a -> b #

foldr1 :: (a -> a -> a) -> CatchFormalParameter a -> a #

foldl1 :: (a -> a -> a) -> CatchFormalParameter a -> a #

toList :: CatchFormalParameter a -> [a] #

null :: CatchFormalParameter a -> Bool #

length :: CatchFormalParameter a -> Int #

elem :: Eq a => a -> CatchFormalParameter a -> Bool #

maximum :: Ord a => CatchFormalParameter a -> a #

minimum :: Ord a => CatchFormalParameter a -> a #

sum :: Num a => CatchFormalParameter a -> a #

product :: Num a => CatchFormalParameter a -> a #

Traversable CatchFormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching CatchFormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal CatchFormalParameter 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 (CatchFormalParameter a)

Eq a => Eq (CatchFormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (CatchFormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (CatchFormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (CatchFormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (CatchFormalParameter a) :: Type -> Type #

Generic1 CatchFormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 CatchFormalParameter :: k -> Type #

type Rep (CatchFormalParameter a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (CatchFormalParameter a) = D1 (MetaData "CatchFormalParameter" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "CatchFormalParameter" PrefixI True) ((S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "name") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Identifier a))) :*: (S1 (MetaSel (Just "dimensions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Dimensions a))) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((CatchType :+: Modifiers) a))))))
type Rep1 CatchFormalParameter Source # 
Instance details

Defined in TreeSitter.Java.AST

data CatchClause a Source #

Constructors

CatchClause 

Fields

Instances
Functor CatchClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> CatchClause a -> CatchClause b #

(<$) :: a -> CatchClause b -> CatchClause a #

Foldable CatchClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => CatchClause m -> m #

foldMap :: Monoid m => (a -> m) -> CatchClause a -> m #

foldr :: (a -> b -> b) -> b -> CatchClause a -> b #

foldr' :: (a -> b -> b) -> b -> CatchClause a -> b #

foldl :: (b -> a -> b) -> b -> CatchClause a -> b #

foldl' :: (b -> a -> b) -> b -> CatchClause a -> b #

foldr1 :: (a -> a -> a) -> CatchClause a -> a #

foldl1 :: (a -> a -> a) -> CatchClause a -> a #

toList :: CatchClause a -> [a] #

null :: CatchClause a -> Bool #

length :: CatchClause a -> Int #

elem :: Eq a => a -> CatchClause a -> Bool #

maximum :: Ord a => CatchClause a -> a #

minimum :: Ord a => CatchClause a -> a #

sum :: Num a => CatchClause a -> a #

product :: Num a => CatchClause a -> a #

Traversable CatchClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> CatchClause a -> f (CatchClause b) #

sequenceA :: Applicative f => CatchClause (f a) -> f (CatchClause a) #

mapM :: Monad m => (a -> m b) -> CatchClause a -> m (CatchClause b) #

sequence :: Monad m => CatchClause (m a) -> m (CatchClause a) #

SymbolMatching CatchClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal CatchClause 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 (CatchClause a)

Eq a => Eq (CatchClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (CatchClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (CatchClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (CatchClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (CatchClause a) :: Type -> Type #

Methods

from :: CatchClause a -> Rep (CatchClause a) x #

to :: Rep (CatchClause a) x -> CatchClause a #

Generic1 CatchClause Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 CatchClause :: k -> Type #

type Rep (CatchClause a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (CatchClause a) = D1 (MetaData "CatchClause" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "CatchClause" 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 (CatchFormalParameter a)))))
type Rep1 CatchClause Source # 
Instance details

Defined in TreeSitter.Java.AST

data CastExpression a Source #

Constructors

CastExpression 

Fields

Instances
Functor CastExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> CastExpression a -> CastExpression b #

(<$) :: a -> CastExpression b -> CastExpression a #

Foldable CastExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => CastExpression m -> m #

foldMap :: Monoid m => (a -> m) -> CastExpression a -> m #

foldr :: (a -> b -> b) -> b -> CastExpression a -> b #

foldr' :: (a -> b -> b) -> b -> CastExpression a -> b #

foldl :: (b -> a -> b) -> b -> CastExpression a -> b #

foldl' :: (b -> a -> b) -> b -> CastExpression a -> b #

foldr1 :: (a -> a -> a) -> CastExpression a -> a #

foldl1 :: (a -> a -> a) -> CastExpression a -> a #

toList :: CastExpression a -> [a] #

null :: CastExpression a -> Bool #

length :: CastExpression a -> Int #

elem :: Eq a => a -> CastExpression a -> Bool #

maximum :: Ord a => CastExpression a -> a #

minimum :: Ord a => CastExpression a -> a #

sum :: Num a => CastExpression a -> a #

product :: Num a => CastExpression a -> a #

Traversable CastExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> CastExpression a -> f (CastExpression b) #

sequenceA :: Applicative f => CastExpression (f a) -> f (CastExpression a) #

mapM :: Monad m => (a -> m b) -> CastExpression a -> m (CastExpression b) #

sequence :: Monad m => CastExpression (m a) -> m (CastExpression a) #

SymbolMatching CastExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal CastExpression 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 (CastExpression a)

Eq a => Eq (CastExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (CastExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (CastExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (CastExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (CastExpression a) :: Type -> Type #

Generic1 CastExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 CastExpression :: k -> Type #

type Rep (CastExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (CastExpression a) = D1 (MetaData "CastExpression" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "CastExpression" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: (S1 (MetaSel (Just "value") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Expression a)) :*: S1 (MetaSel (Just "type'") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (Type a))))))
type Rep1 CastExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data BreakStatement a Source #

Constructors

BreakStatement 

Fields

Instances
Functor BreakStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> BreakStatement a -> BreakStatement b #

(<$) :: a -> BreakStatement b -> BreakStatement a #

Foldable BreakStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => BreakStatement m -> m #

foldMap :: Monoid m => (a -> m) -> BreakStatement a -> m #

foldr :: (a -> b -> b) -> b -> BreakStatement a -> b #

foldr' :: (a -> b -> b) -> b -> BreakStatement a -> b #

foldl :: (b -> a -> b) -> b -> BreakStatement a -> b #

foldl' :: (b -> a -> b) -> b -> BreakStatement a -> b #

foldr1 :: (a -> a -> a) -> BreakStatement a -> a #

foldl1 :: (a -> a -> a) -> BreakStatement a -> a #

toList :: BreakStatement a -> [a] #

null :: BreakStatement a -> Bool #

length :: BreakStatement a -> Int #

elem :: Eq a => a -> BreakStatement a -> Bool #

maximum :: Ord a => BreakStatement a -> a #

minimum :: Ord a => BreakStatement a -> a #

sum :: Num a => BreakStatement a -> a #

product :: Num a => BreakStatement a -> a #

Traversable BreakStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> BreakStatement a -> f (BreakStatement b) #

sequenceA :: Applicative f => BreakStatement (f a) -> f (BreakStatement a) #

mapM :: Monad m => (a -> m b) -> BreakStatement a -> m (BreakStatement b) #

sequence :: Monad m => BreakStatement (m a) -> m (BreakStatement a) #

SymbolMatching BreakStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal BreakStatement 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 (BreakStatement a)

Eq a => Eq (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (BreakStatement a) :: Type -> Type #

Generic1 BreakStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 BreakStatement :: k -> Type #

type Rep (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (BreakStatement a) = D1 (MetaData "BreakStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "BreakStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Identifier a)))))
type Rep1 BreakStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 BreakStatement = D1 (MetaData "BreakStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "BreakStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Maybe :.: Rec1 Identifier)))

data Block a Source #

Constructors

Block 

Fields

Instances
Functor Block Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Block a -> Block b #

(<$) :: a -> Block b -> Block a #

Foldable Block Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Block m -> m #

foldMap :: Monoid m => (a -> m) -> Block a -> m #

foldr :: (a -> b -> b) -> b -> Block a -> b #

foldr' :: (a -> b -> b) -> b -> Block a -> b #

foldl :: (b -> a -> b) -> b -> Block a -> b #

foldl' :: (b -> a -> b) -> b -> Block a -> b #

foldr1 :: (a -> a -> a) -> Block a -> a #

foldl1 :: (a -> a -> a) -> Block a -> a #

toList :: Block a -> [a] #

null :: Block a -> Bool #

length :: Block a -> Int #

elem :: Eq a => a -> Block a -> Bool #

maximum :: Ord a => Block a -> a #

minimum :: Ord a => Block a -> a #

sum :: Num a => Block a -> a #

product :: Num a => Block a -> a #

Traversable Block Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Block a -> f (Block b) #

sequenceA :: Applicative f => Block (f a) -> f (Block a) #

mapM :: Monad m => (a -> m b) -> Block a -> m (Block b) #

sequence :: Monad m => Block (m a) -> m (Block a) #

SymbolMatching Block Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Block -> Node -> Bool

showFailure :: Proxy Block -> Node -> String

Unmarshal Block 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 (Block a)

Eq a => Eq (Block a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Block a -> Block a -> Bool #

(/=) :: Block a -> Block a -> Bool #

Ord a => Ord (Block a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Block a -> Block a -> Ordering #

(<) :: Block a -> Block a -> Bool #

(<=) :: Block a -> Block a -> Bool #

(>) :: Block a -> Block a -> Bool #

(>=) :: Block a -> Block a -> Bool #

max :: Block a -> Block a -> Block a #

min :: Block a -> Block a -> Block a #

Show a => Show (Block a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Block a -> ShowS #

show :: Block a -> String #

showList :: [Block a] -> ShowS #

Generic (Block a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Block a) :: Type -> Type #

Methods

from :: Block a -> Rep (Block a) x #

to :: Rep (Block a) x -> Block a #

Generic1 Block Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Block :: k -> Type #

Methods

from1 :: Block a -> Rep1 Block a #

to1 :: Rep1 Block a -> Block a #

type Rep (Block a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Block a) = D1 (MetaData "Block" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "Block" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Statement a])))
type Rep1 Block Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Block = D1 (MetaData "Block" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "Block" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 Statement)))

data BinaryExpression a Source #

Instances
Functor BinaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> BinaryExpression a -> BinaryExpression b #

(<$) :: a -> BinaryExpression b -> BinaryExpression a #

Foldable BinaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => BinaryExpression m -> m #

foldMap :: Monoid m => (a -> m) -> BinaryExpression a -> m #

foldr :: (a -> b -> b) -> b -> BinaryExpression a -> b #

foldr' :: (a -> b -> b) -> b -> BinaryExpression a -> b #

foldl :: (b -> a -> b) -> b -> BinaryExpression a -> b #

foldl' :: (b -> a -> b) -> b -> BinaryExpression a -> b #

foldr1 :: (a -> a -> a) -> BinaryExpression a -> a #

foldl1 :: (a -> a -> a) -> BinaryExpression a -> a #

toList :: BinaryExpression a -> [a] #

null :: BinaryExpression a -> Bool #

length :: BinaryExpression a -> Int #

elem :: Eq a => a -> BinaryExpression a -> Bool #

maximum :: Ord a => BinaryExpression a -> a #

minimum :: Ord a => BinaryExpression a -> a #

sum :: Num a => BinaryExpression a -> a #

product :: Num a => BinaryExpression a -> a #

Traversable BinaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> BinaryExpression a -> f (BinaryExpression b) #

sequenceA :: Applicative f => BinaryExpression (f a) -> f (BinaryExpression a) #

mapM :: Monad m => (a -> m b) -> BinaryExpression a -> m (BinaryExpression b) #

sequence :: Monad m => BinaryExpression (m a) -> m (BinaryExpression a) #

SymbolMatching BinaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal BinaryExpression 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 (BinaryExpression a)

Eq a => Eq (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (BinaryExpression a) :: Type -> Type #

Generic1 BinaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 BinaryExpression :: k -> Type #

type Rep (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 BinaryExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data Asterisk a Source #

Constructors

Asterisk 

Fields

Instances
Functor Asterisk Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Asterisk a -> Asterisk b #

(<$) :: a -> Asterisk b -> Asterisk a #

Foldable Asterisk Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Asterisk m -> m #

foldMap :: Monoid m => (a -> m) -> Asterisk a -> m #

foldr :: (a -> b -> b) -> b -> Asterisk a -> b #

foldr' :: (a -> b -> b) -> b -> Asterisk a -> b #

foldl :: (b -> a -> b) -> b -> Asterisk a -> b #

foldl' :: (b -> a -> b) -> b -> Asterisk a -> b #

foldr1 :: (a -> a -> a) -> Asterisk a -> a #

foldl1 :: (a -> a -> a) -> Asterisk a -> a #

toList :: Asterisk a -> [a] #

null :: Asterisk a -> Bool #

length :: Asterisk a -> Int #

elem :: Eq a => a -> Asterisk a -> Bool #

maximum :: Ord a => Asterisk a -> a #

minimum :: Ord a => Asterisk a -> a #

sum :: Num a => Asterisk a -> a #

product :: Num a => Asterisk a -> a #

Traversable Asterisk Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Asterisk a -> f (Asterisk b) #

sequenceA :: Applicative f => Asterisk (f a) -> f (Asterisk a) #

mapM :: Monad m => (a -> m b) -> Asterisk a -> m (Asterisk b) #

sequence :: Monad m => Asterisk (m a) -> m (Asterisk a) #

SymbolMatching Asterisk Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Asterisk -> Node -> Bool

showFailure :: Proxy Asterisk -> Node -> String

Unmarshal Asterisk 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 (Asterisk a)

Eq a => Eq (Asterisk a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Asterisk a -> Asterisk a -> Bool #

(/=) :: Asterisk a -> Asterisk a -> Bool #

Ord a => Ord (Asterisk a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Asterisk a -> Asterisk a -> Ordering #

(<) :: Asterisk a -> Asterisk a -> Bool #

(<=) :: Asterisk a -> Asterisk a -> Bool #

(>) :: Asterisk a -> Asterisk a -> Bool #

(>=) :: Asterisk a -> Asterisk a -> Bool #

max :: Asterisk a -> Asterisk a -> Asterisk a #

min :: Asterisk a -> Asterisk a -> Asterisk a #

Show a => Show (Asterisk a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Asterisk a -> ShowS #

show :: Asterisk a -> String #

showList :: [Asterisk a] -> ShowS #

Generic (Asterisk a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Asterisk a) :: Type -> Type #

Methods

from :: Asterisk a -> Rep (Asterisk a) x #

to :: Rep (Asterisk a) x -> Asterisk a #

Generic1 Asterisk Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Asterisk :: k -> Type #

Methods

from1 :: Asterisk a -> Rep1 Asterisk a #

to1 :: Rep1 Asterisk a -> Asterisk a #

type Rep (Asterisk a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Asterisk a) = D1 (MetaData "Asterisk" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "Asterisk" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))
type Rep1 Asterisk Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Asterisk = D1 (MetaData "Asterisk" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "Asterisk" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "text") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

data AssignmentExpression a Source #

Instances
Functor AssignmentExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AssignmentExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AssignmentExpression m -> m #

foldMap :: Monoid m => (a -> m) -> AssignmentExpression a -> m #

foldr :: (a -> b -> b) -> b -> AssignmentExpression a -> b #

foldr' :: (a -> b -> b) -> b -> AssignmentExpression a -> b #

foldl :: (b -> a -> b) -> b -> AssignmentExpression a -> b #

foldl' :: (b -> a -> b) -> b -> AssignmentExpression a -> b #

foldr1 :: (a -> a -> a) -> AssignmentExpression a -> a #

foldl1 :: (a -> a -> a) -> AssignmentExpression a -> a #

toList :: AssignmentExpression a -> [a] #

null :: AssignmentExpression a -> Bool #

length :: AssignmentExpression a -> Int #

elem :: Eq a => a -> AssignmentExpression a -> Bool #

maximum :: Ord a => AssignmentExpression a -> a #

minimum :: Ord a => AssignmentExpression a -> a #

sum :: Num a => AssignmentExpression a -> a #

product :: Num a => AssignmentExpression a -> a #

Traversable AssignmentExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AssignmentExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AssignmentExpression 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 (AssignmentExpression a)

Eq a => Eq (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AssignmentExpression a) :: Type -> Type #

Generic1 AssignmentExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AssignmentExpression :: k -> Type #

type Rep (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AssignmentExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data AssertStatement a Source #

Constructors

AssertStatement 

Fields

Instances
Functor AssertStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AssertStatement a -> AssertStatement b #

(<$) :: a -> AssertStatement b -> AssertStatement a #

Foldable AssertStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AssertStatement m -> m #

foldMap :: Monoid m => (a -> m) -> AssertStatement a -> m #

foldr :: (a -> b -> b) -> b -> AssertStatement a -> b #

foldr' :: (a -> b -> b) -> b -> AssertStatement a -> b #

foldl :: (b -> a -> b) -> b -> AssertStatement a -> b #

foldl' :: (b -> a -> b) -> b -> AssertStatement a -> b #

foldr1 :: (a -> a -> a) -> AssertStatement a -> a #

foldl1 :: (a -> a -> a) -> AssertStatement a -> a #

toList :: AssertStatement a -> [a] #

null :: AssertStatement a -> Bool #

length :: AssertStatement a -> Int #

elem :: Eq a => a -> AssertStatement a -> Bool #

maximum :: Ord a => AssertStatement a -> a #

minimum :: Ord a => AssertStatement a -> a #

sum :: Num a => AssertStatement a -> a #

product :: Num a => AssertStatement a -> a #

Traversable AssertStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AssertStatement a -> f (AssertStatement b) #

sequenceA :: Applicative f => AssertStatement (f a) -> f (AssertStatement a) #

mapM :: Monad m => (a -> m b) -> AssertStatement a -> m (AssertStatement b) #

sequence :: Monad m => AssertStatement (m a) -> m (AssertStatement a) #

SymbolMatching AssertStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AssertStatement 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 (AssertStatement a)

Eq a => Eq (AssertStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AssertStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AssertStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AssertStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AssertStatement a) :: Type -> Type #

Generic1 AssertStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AssertStatement :: k -> Type #

type Rep (AssertStatement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AssertStatement a) = D1 (MetaData "AssertStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AssertStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (Expression a)))))
type Rep1 AssertStatement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AssertStatement = D1 (MetaData "AssertStatement" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AssertStatement" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 Expression)))

data ArrayType a Source #

Constructors

ArrayType 

Fields

Instances
Functor ArrayType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ArrayType a -> ArrayType b #

(<$) :: a -> ArrayType b -> ArrayType a #

Foldable ArrayType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ArrayType m -> m #

foldMap :: Monoid m => (a -> m) -> ArrayType a -> m #

foldr :: (a -> b -> b) -> b -> ArrayType a -> b #

foldr' :: (a -> b -> b) -> b -> ArrayType a -> b #

foldl :: (b -> a -> b) -> b -> ArrayType a -> b #

foldl' :: (b -> a -> b) -> b -> ArrayType a -> b #

foldr1 :: (a -> a -> a) -> ArrayType a -> a #

foldl1 :: (a -> a -> a) -> ArrayType a -> a #

toList :: ArrayType a -> [a] #

null :: ArrayType a -> Bool #

length :: ArrayType a -> Int #

elem :: Eq a => a -> ArrayType a -> Bool #

maximum :: Ord a => ArrayType a -> a #

minimum :: Ord a => ArrayType a -> a #

sum :: Num a => ArrayType a -> a #

product :: Num a => ArrayType a -> a #

Traversable ArrayType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArrayType a -> f (ArrayType b) #

sequenceA :: Applicative f => ArrayType (f a) -> f (ArrayType a) #

mapM :: Monad m => (a -> m b) -> ArrayType a -> m (ArrayType b) #

sequence :: Monad m => ArrayType (m a) -> m (ArrayType a) #

SymbolMatching ArrayType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy ArrayType -> Node -> Bool

showFailure :: Proxy ArrayType -> Node -> String

Unmarshal ArrayType 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 (ArrayType a)

Eq a => Eq (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: ArrayType a -> ArrayType a -> Bool #

(/=) :: ArrayType a -> ArrayType a -> Bool #

Ord a => Ord (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ArrayType a) :: Type -> Type #

Methods

from :: ArrayType a -> Rep (ArrayType a) x #

to :: Rep (ArrayType a) x -> ArrayType a #

Generic1 ArrayType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ArrayType :: k -> Type #

type Rep (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ArrayType a) = D1 (MetaData "ArrayType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ArrayType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: (S1 (MetaSel (Just "dimensions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Dimensions a)) :*: S1 (MetaSel (Just "element") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (UnannotatedType a)))))
type Rep1 ArrayType Source # 
Instance details

Defined in TreeSitter.Java.AST

data ArrayInitializer a Source #

Constructors

ArrayInitializer 
Instances
Functor ArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ArrayInitializer a -> ArrayInitializer b #

(<$) :: a -> ArrayInitializer b -> ArrayInitializer a #

Foldable ArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ArrayInitializer m -> m #

foldMap :: Monoid m => (a -> m) -> ArrayInitializer a -> m #

foldr :: (a -> b -> b) -> b -> ArrayInitializer a -> b #

foldr' :: (a -> b -> b) -> b -> ArrayInitializer a -> b #

foldl :: (b -> a -> b) -> b -> ArrayInitializer a -> b #

foldl' :: (b -> a -> b) -> b -> ArrayInitializer a -> b #

foldr1 :: (a -> a -> a) -> ArrayInitializer a -> a #

foldl1 :: (a -> a -> a) -> ArrayInitializer a -> a #

toList :: ArrayInitializer a -> [a] #

null :: ArrayInitializer a -> Bool #

length :: ArrayInitializer a -> Int #

elem :: Eq a => a -> ArrayInitializer a -> Bool #

maximum :: Ord a => ArrayInitializer a -> a #

minimum :: Ord a => ArrayInitializer a -> a #

sum :: Num a => ArrayInitializer a -> a #

product :: Num a => ArrayInitializer a -> a #

Traversable ArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArrayInitializer a -> f (ArrayInitializer b) #

sequenceA :: Applicative f => ArrayInitializer (f a) -> f (ArrayInitializer a) #

mapM :: Monad m => (a -> m b) -> ArrayInitializer a -> m (ArrayInitializer b) #

sequence :: Monad m => ArrayInitializer (m a) -> m (ArrayInitializer a) #

SymbolMatching ArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ArrayInitializer 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 (ArrayInitializer a)

Eq a => Eq (ArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ArrayInitializer a) :: Type -> Type #

Generic1 ArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ArrayInitializer :: k -> Type #

type Rep (ArrayInitializer a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ArrayInitializer a) = D1 (MetaData "ArrayInitializer" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ArrayInitializer" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [(Expression :+: ArrayInitializer) a])))
type Rep1 ArrayInitializer Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ArrayInitializer = D1 (MetaData "ArrayInitializer" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ArrayInitializer" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 (Expression :+: ArrayInitializer))))

data ArrayCreationExpression a Source #

Instances
Functor ArrayCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable ArrayCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ArrayCreationExpression m -> m #

foldMap :: Monoid m => (a -> m) -> ArrayCreationExpression a -> m #

foldr :: (a -> b -> b) -> b -> ArrayCreationExpression a -> b #

foldr' :: (a -> b -> b) -> b -> ArrayCreationExpression a -> b #

foldl :: (b -> a -> b) -> b -> ArrayCreationExpression a -> b #

foldl' :: (b -> a -> b) -> b -> ArrayCreationExpression a -> b #

foldr1 :: (a -> a -> a) -> ArrayCreationExpression a -> a #

foldl1 :: (a -> a -> a) -> ArrayCreationExpression a -> a #

toList :: ArrayCreationExpression a -> [a] #

null :: ArrayCreationExpression a -> Bool #

length :: ArrayCreationExpression a -> Int #

elem :: Eq a => a -> ArrayCreationExpression a -> Bool #

maximum :: Ord a => ArrayCreationExpression a -> a #

minimum :: Ord a => ArrayCreationExpression a -> a #

sum :: Num a => ArrayCreationExpression a -> a #

product :: Num a => ArrayCreationExpression a -> a #

Traversable ArrayCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching ArrayCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ArrayCreationExpression 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 (ArrayCreationExpression a)

Eq a => Eq (ArrayCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ArrayCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ArrayCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ArrayCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ArrayCreationExpression a) :: Type -> Type #

Generic1 ArrayCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ArrayCreationExpression :: k -> Type #

type Rep (ArrayCreationExpression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ArrayCreationExpression Source # 
Instance details

Defined in TreeSitter.Java.AST

data ArrayAccess a Source #

Constructors

ArrayAccess 
Instances
Functor ArrayAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ArrayAccess a -> ArrayAccess b #

(<$) :: a -> ArrayAccess b -> ArrayAccess a #

Foldable ArrayAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ArrayAccess m -> m #

foldMap :: Monoid m => (a -> m) -> ArrayAccess a -> m #

foldr :: (a -> b -> b) -> b -> ArrayAccess a -> b #

foldr' :: (a -> b -> b) -> b -> ArrayAccess a -> b #

foldl :: (b -> a -> b) -> b -> ArrayAccess a -> b #

foldl' :: (b -> a -> b) -> b -> ArrayAccess a -> b #

foldr1 :: (a -> a -> a) -> ArrayAccess a -> a #

foldl1 :: (a -> a -> a) -> ArrayAccess a -> a #

toList :: ArrayAccess a -> [a] #

null :: ArrayAccess a -> Bool #

length :: ArrayAccess a -> Int #

elem :: Eq a => a -> ArrayAccess a -> Bool #

maximum :: Ord a => ArrayAccess a -> a #

minimum :: Ord a => ArrayAccess a -> a #

sum :: Num a => ArrayAccess a -> a #

product :: Num a => ArrayAccess a -> a #

Traversable ArrayAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArrayAccess a -> f (ArrayAccess b) #

sequenceA :: Applicative f => ArrayAccess (f a) -> f (ArrayAccess a) #

mapM :: Monad m => (a -> m b) -> ArrayAccess a -> m (ArrayAccess b) #

sequence :: Monad m => ArrayAccess (m a) -> m (ArrayAccess a) #

SymbolMatching ArrayAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ArrayAccess 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 (ArrayAccess a)

Eq a => Eq (ArrayAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ArrayAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ArrayAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ArrayAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ArrayAccess a) :: Type -> Type #

Methods

from :: ArrayAccess a -> Rep (ArrayAccess a) x #

to :: Rep (ArrayAccess a) x -> ArrayAccess a #

Generic1 ArrayAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ArrayAccess :: k -> Type #

type Rep (ArrayAccess a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ArrayAccess Source # 
Instance details

Defined in TreeSitter.Java.AST

data ArgumentList a Source #

Constructors

ArgumentList 

Fields

Instances
Functor ArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> ArgumentList a -> ArgumentList b #

(<$) :: a -> ArgumentList b -> ArgumentList a #

Foldable ArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => ArgumentList m -> m #

foldMap :: Monoid m => (a -> m) -> ArgumentList a -> m #

foldr :: (a -> b -> b) -> b -> ArgumentList a -> b #

foldr' :: (a -> b -> b) -> b -> ArgumentList a -> b #

foldl :: (b -> a -> b) -> b -> ArgumentList a -> b #

foldl' :: (b -> a -> b) -> b -> ArgumentList a -> b #

foldr1 :: (a -> a -> a) -> ArgumentList a -> a #

foldl1 :: (a -> a -> a) -> ArgumentList a -> a #

toList :: ArgumentList a -> [a] #

null :: ArgumentList a -> Bool #

length :: ArgumentList a -> Int #

elem :: Eq a => a -> ArgumentList a -> Bool #

maximum :: Ord a => ArgumentList a -> a #

minimum :: Ord a => ArgumentList a -> a #

sum :: Num a => ArgumentList a -> a #

product :: Num a => ArgumentList a -> a #

Traversable ArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArgumentList a -> f (ArgumentList b) #

sequenceA :: Applicative f => ArgumentList (f a) -> f (ArgumentList a) #

mapM :: Monad m => (a -> m b) -> ArgumentList a -> m (ArgumentList b) #

sequence :: Monad m => ArgumentList (m a) -> m (ArgumentList a) #

SymbolMatching ArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal ArgumentList 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 (ArgumentList a)

Eq a => Eq (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (ArgumentList a) :: Type -> Type #

Methods

from :: ArgumentList a -> Rep (ArgumentList a) x #

to :: Rep (ArgumentList a) x -> ArgumentList a #

Generic1 ArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 ArgumentList :: k -> Type #

type Rep (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (ArgumentList a) = D1 (MetaData "ArgumentList" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ArgumentList" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression a])))
type Rep1 ArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 ArgumentList = D1 (MetaData "ArgumentList" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "ArgumentList" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 Expression)))

data AnnotationTypeElementDeclaration a Source #

Instances
Functor AnnotationTypeElementDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnnotationTypeElementDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable AnnotationTypeElementDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnnotationTypeElementDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnnotationTypeElementDeclaration 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 (AnnotationTypeElementDeclaration a)

Eq a => Eq (AnnotationTypeElementDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnnotationTypeElementDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnnotationTypeElementDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnnotationTypeElementDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnnotationTypeElementDeclaration a) :: Type -> Type #

Generic1 AnnotationTypeElementDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnnotationTypeElementDeclaration :: k -> Type #

type Rep (AnnotationTypeElementDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnnotationTypeElementDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data AnnotationTypeDeclaration a Source #

Instances
Functor AnnotationTypeDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnnotationTypeDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnnotationTypeDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> AnnotationTypeDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> AnnotationTypeDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> AnnotationTypeDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> AnnotationTypeDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> AnnotationTypeDeclaration a -> b #

foldr1 :: (a -> a -> a) -> AnnotationTypeDeclaration a -> a #

foldl1 :: (a -> a -> a) -> AnnotationTypeDeclaration a -> a #

toList :: AnnotationTypeDeclaration a -> [a] #

null :: AnnotationTypeDeclaration a -> Bool #

length :: AnnotationTypeDeclaration a -> Int #

elem :: Eq a => a -> AnnotationTypeDeclaration a -> Bool #

maximum :: Ord a => AnnotationTypeDeclaration a -> a #

minimum :: Ord a => AnnotationTypeDeclaration a -> a #

sum :: Num a => AnnotationTypeDeclaration a -> a #

product :: Num a => AnnotationTypeDeclaration a -> a #

Traversable AnnotationTypeDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnnotationTypeDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnnotationTypeDeclaration 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 (AnnotationTypeDeclaration a)

Eq a => Eq (AnnotationTypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnnotationTypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnnotationTypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnnotationTypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnnotationTypeDeclaration a) :: Type -> Type #

Generic1 AnnotationTypeDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnnotationTypeDeclaration :: k -> Type #

type Rep (AnnotationTypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnnotationTypeDeclaration a) = D1 (MetaData "AnnotationTypeDeclaration" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AnnotationTypeDeclaration" PrefixI True) ((S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "body") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (AnnotationTypeBody a))) :*: (S1 (MetaSel (Just "name") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Identifier a)) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Modifiers a))))))
type Rep1 AnnotationTypeDeclaration Source # 
Instance details

Defined in TreeSitter.Java.AST

data AnnotationTypeBody a Source #

Instances
Functor AnnotationTypeBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnnotationTypeBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnnotationTypeBody m -> m #

foldMap :: Monoid m => (a -> m) -> AnnotationTypeBody a -> m #

foldr :: (a -> b -> b) -> b -> AnnotationTypeBody a -> b #

foldr' :: (a -> b -> b) -> b -> AnnotationTypeBody a -> b #

foldl :: (b -> a -> b) -> b -> AnnotationTypeBody a -> b #

foldl' :: (b -> a -> b) -> b -> AnnotationTypeBody a -> b #

foldr1 :: (a -> a -> a) -> AnnotationTypeBody a -> a #

foldl1 :: (a -> a -> a) -> AnnotationTypeBody a -> a #

toList :: AnnotationTypeBody a -> [a] #

null :: AnnotationTypeBody a -> Bool #

length :: AnnotationTypeBody a -> Int #

elem :: Eq a => a -> AnnotationTypeBody a -> Bool #

maximum :: Ord a => AnnotationTypeBody a -> a #

minimum :: Ord a => AnnotationTypeBody a -> a #

sum :: Num a => AnnotationTypeBody a -> a #

product :: Num a => AnnotationTypeBody a -> a #

Traversable AnnotationTypeBody Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnnotationTypeBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnnotationTypeBody 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 (AnnotationTypeBody a)

Eq a => Eq (AnnotationTypeBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnnotationTypeBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnnotationTypeBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnnotationTypeBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnnotationTypeBody a) :: Type -> Type #

Generic1 AnnotationTypeBody Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnnotationTypeBody :: k -> Type #

type Rep (AnnotationTypeBody a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnnotationTypeBody Source # 
Instance details

Defined in TreeSitter.Java.AST

data AnnotationArgumentList a Source #

Instances
Functor AnnotationArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnnotationArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnnotationArgumentList m -> m #

foldMap :: Monoid m => (a -> m) -> AnnotationArgumentList a -> m #

foldr :: (a -> b -> b) -> b -> AnnotationArgumentList a -> b #

foldr' :: (a -> b -> b) -> b -> AnnotationArgumentList a -> b #

foldl :: (b -> a -> b) -> b -> AnnotationArgumentList a -> b #

foldl' :: (b -> a -> b) -> b -> AnnotationArgumentList a -> b #

foldr1 :: (a -> a -> a) -> AnnotationArgumentList a -> a #

foldl1 :: (a -> a -> a) -> AnnotationArgumentList a -> a #

toList :: AnnotationArgumentList a -> [a] #

null :: AnnotationArgumentList a -> Bool #

length :: AnnotationArgumentList a -> Int #

elem :: Eq a => a -> AnnotationArgumentList a -> Bool #

maximum :: Ord a => AnnotationArgumentList a -> a #

minimum :: Ord a => AnnotationArgumentList a -> a #

sum :: Num a => AnnotationArgumentList a -> a #

product :: Num a => AnnotationArgumentList a -> a #

Traversable AnnotationArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnnotationArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnnotationArgumentList 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 (AnnotationArgumentList a)

Eq a => Eq (AnnotationArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnnotationArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnnotationArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnnotationArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnnotationArgumentList a) :: Type -> Type #

Generic1 AnnotationArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnnotationArgumentList :: k -> Type #

type Rep (AnnotationArgumentList a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnnotationArgumentList a) = D1 (MetaData "AnnotationArgumentList" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AnnotationArgumentList" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [((Expression :+: Annotation) :+: (ElementValueArrayInitializer :+: (ElementValuePair :+: MarkerAnnotation))) a])))
type Rep1 AnnotationArgumentList Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnnotationArgumentList = D1 (MetaData "AnnotationArgumentList" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AnnotationArgumentList" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) ([] :.: Rec1 ((Expression :+: Annotation) :+: (ElementValueArrayInitializer :+: (ElementValuePair :+: MarkerAnnotation))))))

data Annotation a Source #

Instances
Functor Annotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Annotation a -> Annotation b #

(<$) :: a -> Annotation b -> Annotation a #

Foldable Annotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Annotation m -> m #

foldMap :: Monoid m => (a -> m) -> Annotation a -> m #

foldr :: (a -> b -> b) -> b -> Annotation a -> b #

foldr' :: (a -> b -> b) -> b -> Annotation a -> b #

foldl :: (b -> a -> b) -> b -> Annotation a -> b #

foldl' :: (b -> a -> b) -> b -> Annotation a -> b #

foldr1 :: (a -> a -> a) -> Annotation a -> a #

foldl1 :: (a -> a -> a) -> Annotation a -> a #

toList :: Annotation a -> [a] #

null :: Annotation a -> Bool #

length :: Annotation a -> Int #

elem :: Eq a => a -> Annotation a -> Bool #

maximum :: Ord a => Annotation a -> a #

minimum :: Ord a => Annotation a -> a #

sum :: Num a => Annotation a -> a #

product :: Num a => Annotation a -> a #

Traversable Annotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Annotation a -> f (Annotation b) #

sequenceA :: Applicative f => Annotation (f a) -> f (Annotation a) #

mapM :: Monad m => (a -> m b) -> Annotation a -> m (Annotation b) #

sequence :: Monad m => Annotation (m a) -> m (Annotation a) #

SymbolMatching Annotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal Annotation 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 (Annotation a)

Eq a => Eq (Annotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Annotation a -> Annotation a -> Bool #

(/=) :: Annotation a -> Annotation a -> Bool #

Ord a => Ord (Annotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (Annotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (Annotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Annotation a) :: Type -> Type #

Methods

from :: Annotation a -> Rep (Annotation a) x #

to :: Rep (Annotation a) x -> Annotation a #

Generic1 Annotation Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Annotation :: k -> Type #

type Rep (Annotation a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Annotation Source # 
Instance details

Defined in TreeSitter.Java.AST

data AnnotatedType a Source #

Instances
Functor AnnotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnnotatedType a -> AnnotatedType b #

(<$) :: a -> AnnotatedType b -> AnnotatedType a #

Foldable AnnotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnnotatedType m -> m #

foldMap :: Monoid m => (a -> m) -> AnnotatedType a -> m #

foldr :: (a -> b -> b) -> b -> AnnotatedType a -> b #

foldr' :: (a -> b -> b) -> b -> AnnotatedType a -> b #

foldl :: (b -> a -> b) -> b -> AnnotatedType a -> b #

foldl' :: (b -> a -> b) -> b -> AnnotatedType a -> b #

foldr1 :: (a -> a -> a) -> AnnotatedType a -> a #

foldl1 :: (a -> a -> a) -> AnnotatedType a -> a #

toList :: AnnotatedType a -> [a] #

null :: AnnotatedType a -> Bool #

length :: AnnotatedType a -> Int #

elem :: Eq a => a -> AnnotatedType a -> Bool #

maximum :: Ord a => AnnotatedType a -> a #

minimum :: Ord a => AnnotatedType a -> a #

sum :: Num a => AnnotatedType a -> a #

product :: Num a => AnnotatedType a -> a #

Traversable AnnotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnnotatedType a -> f (AnnotatedType b) #

sequenceA :: Applicative f => AnnotatedType (f a) -> f (AnnotatedType a) #

mapM :: Monad m => (a -> m b) -> AnnotatedType a -> m (AnnotatedType b) #

sequence :: Monad m => AnnotatedType (m a) -> m (AnnotatedType a) #

SymbolMatching AnnotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnnotatedType 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 (AnnotatedType a)

Eq a => Eq (AnnotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnnotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnnotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnnotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnnotatedType a) :: Type -> Type #

Generic1 AnnotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnnotatedType :: k -> Type #

type Rep (AnnotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnnotatedType a) = D1 (MetaData "AnnotatedType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AnnotatedType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty ((UnannotatedType :+: (Annotation :+: MarkerAnnotation)) a)))))
type Rep1 AnnotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnnotatedType = D1 (MetaData "AnnotatedType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" False) (C1 (MetaCons "AnnotatedType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: Rec1 (UnannotatedType :+: (Annotation :+: MarkerAnnotation)))))

newtype UnannotatedType a Source #

Instances
Functor UnannotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> UnannotatedType a -> UnannotatedType b #

(<$) :: a -> UnannotatedType b -> UnannotatedType a #

Foldable UnannotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => UnannotatedType m -> m #

foldMap :: Monoid m => (a -> m) -> UnannotatedType a -> m #

foldr :: (a -> b -> b) -> b -> UnannotatedType a -> b #

foldr' :: (a -> b -> b) -> b -> UnannotatedType a -> b #

foldl :: (b -> a -> b) -> b -> UnannotatedType a -> b #

foldl' :: (b -> a -> b) -> b -> UnannotatedType a -> b #

foldr1 :: (a -> a -> a) -> UnannotatedType a -> a #

foldl1 :: (a -> a -> a) -> UnannotatedType a -> a #

toList :: UnannotatedType a -> [a] #

null :: UnannotatedType a -> Bool #

length :: UnannotatedType a -> Int #

elem :: Eq a => a -> UnannotatedType a -> Bool #

maximum :: Ord a => UnannotatedType a -> a #

minimum :: Ord a => UnannotatedType a -> a #

sum :: Num a => UnannotatedType a -> a #

product :: Num a => UnannotatedType a -> a #

Traversable UnannotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> UnannotatedType a -> f (UnannotatedType b) #

sequenceA :: Applicative f => UnannotatedType (f a) -> f (UnannotatedType a) #

mapM :: Monad m => (a -> m b) -> UnannotatedType a -> m (UnannotatedType b) #

sequence :: Monad m => UnannotatedType (m a) -> m (UnannotatedType a) #

SymbolMatching UnannotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal UnannotatedType 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 (UnannotatedType a)

Eq a => Eq (UnannotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (UnannotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (UnannotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (UnannotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (UnannotatedType a) :: Type -> Type #

Generic1 UnannotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 UnannotatedType :: k -> Type #

type Rep (UnannotatedType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (UnannotatedType a) = D1 (MetaData "UnannotatedType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" True) (C1 (MetaCons "UnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ((SimpleType :+: ArrayType) a))))
type Rep1 UnannotatedType Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 UnannotatedType = D1 (MetaData "UnannotatedType" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" True) (C1 (MetaCons "UnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 (SimpleType :+: ArrayType))))

newtype Type a Source #

Instances
Functor Type Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Type a -> Type b #

(<$) :: a -> Type b -> Type a #

Foldable Type Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Type m -> m #

foldMap :: Monoid m => (a -> m) -> Type a -> m #

foldr :: (a -> b -> b) -> b -> Type a -> b #

foldr' :: (a -> b -> b) -> b -> Type a -> b #

foldl :: (b -> a -> b) -> b -> Type a -> b #

foldl' :: (b -> a -> b) -> b -> Type a -> b #

foldr1 :: (a -> a -> a) -> Type a -> a #

foldl1 :: (a -> a -> a) -> Type a -> a #

toList :: Type a -> [a] #

null :: Type a -> Bool #

length :: Type a -> Int #

elem :: Eq a => a -> Type a -> Bool #

maximum :: Ord a => Type a -> a #

minimum :: Ord a => Type a -> a #

sum :: Num a => Type a -> a #

product :: Num a => Type a -> a #

Traversable Type Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Type a -> f (Type b) #

sequenceA :: Applicative f => Type (f a) -> f (Type a) #

mapM :: Monad m => (a -> m b) -> Type a -> m (Type b) #

sequence :: Monad m => Type (m a) -> m (Type a) #

SymbolMatching Type Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Type -> Node -> Bool

showFailure :: Proxy Type -> Node -> String

Unmarshal Type 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 (Type a)

Eq a => Eq (Type a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Type a -> Type a -> Bool #

(/=) :: Type a -> Type a -> Bool #

Ord a => Ord (Type a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Type a -> Type a -> Ordering #

(<) :: Type a -> Type a -> Bool #

(<=) :: Type a -> Type a -> Bool #

(>) :: Type a -> Type a -> Bool #

(>=) :: Type a -> Type a -> Bool #

max :: Type a -> Type a -> Type a #

min :: Type a -> Type a -> Type a #

Show a => Show (Type a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Type a -> ShowS #

show :: Type a -> String #

showList :: [Type a] -> ShowS #

Generic (Type a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Type a) :: Type -> Type #

Methods

from :: Type a -> Rep (Type a) x #

to :: Rep (Type a) x -> Type a #

Generic1 Type Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Type :: k -> Type #

Methods

from1 :: Type a -> Rep1 Type a #

to1 :: Rep1 Type a -> Type a #

type Rep (Type a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (Type a) = D1 (MetaData "Type" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" True) (C1 (MetaCons "Type" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ((UnannotatedType :+: AnnotatedType) a))))
type Rep1 Type Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Type = D1 (MetaData "Type" "TreeSitter.Java.AST" "tree-sitter-java-0.6.0.0-inplace" True) (C1 (MetaCons "Type" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 (UnannotatedType :+: AnnotatedType))))

newtype Statement a Source #

Instances
Functor Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Statement a -> Statement b #

(<$) :: a -> Statement b -> Statement a #

Foldable Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Statement m -> m #

foldMap :: Monoid m => (a -> m) -> Statement a -> m #

foldr :: (a -> b -> b) -> b -> Statement a -> b #

foldr' :: (a -> b -> b) -> b -> Statement a -> b #

foldl :: (b -> a -> b) -> b -> Statement a -> b #

foldl' :: (b -> a -> b) -> b -> Statement a -> b #

foldr1 :: (a -> a -> a) -> Statement a -> a #

foldl1 :: (a -> a -> a) -> Statement a -> a #

toList :: Statement a -> [a] #

null :: Statement a -> Bool #

length :: Statement a -> Int #

elem :: Eq a => a -> Statement a -> Bool #

maximum :: Ord a => Statement a -> a #

minimum :: Ord a => Statement a -> a #

sum :: Num a => Statement a -> a #

product :: Num a => Statement a -> a #

Traversable Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Statement a -> f (Statement b) #

sequenceA :: Applicative f => Statement (f a) -> f (Statement a) #

mapM :: Monad m => (a -> m b) -> Statement a -> m (Statement b) #

sequence :: Monad m => Statement (m a) -> m (Statement a) #

SymbolMatching Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Statement -> Node -> Bool

showFailure :: Proxy Statement -> Node -> String

Unmarshal Statement 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 (Statement a)

Eq a => Eq (Statement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Statement a -> Statement a -> Bool #

(/=) :: Statement a -> Statement a -> Bool #

Ord a => Ord (Statement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (Statement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (Statement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Statement a) :: Type -> Type #

Methods

from :: Statement a -> Rep (Statement a) x #

to :: Rep (Statement a) x -> Statement a #

Generic1 Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Statement :: k -> Type #

type Rep (Statement a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

newtype SimpleType a Source #

Instances
Functor SimpleType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> SimpleType a -> SimpleType b #

(<$) :: a -> SimpleType b -> SimpleType a #

Foldable SimpleType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => SimpleType m -> m #

foldMap :: Monoid m => (a -> m) -> SimpleType a -> m #

foldr :: (a -> b -> b) -> b -> SimpleType a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleType a -> b #

foldl :: (b -> a -> b) -> b -> SimpleType a -> b #

foldl' :: (b -> a -> b) -> b -> SimpleType a -> b #

foldr1 :: (a -> a -> a) -> SimpleType a -> a #

foldl1 :: (a -> a -> a) -> SimpleType a -> a #

toList :: SimpleType a -> [a] #

null :: SimpleType a -> Bool #

length :: SimpleType a -> Int #

elem :: Eq a => a -> SimpleType a -> Bool #

maximum :: Ord a => SimpleType a -> a #

minimum :: Ord a => SimpleType a -> a #

sum :: Num a => SimpleType a -> a #

product :: Num a => SimpleType a -> a #

Traversable SimpleType Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> SimpleType a -> f (SimpleType b) #

sequenceA :: Applicative f => SimpleType (f a) -> f (SimpleType a) #

mapM :: Monad m => (a -> m b) -> SimpleType a -> m (SimpleType b) #

sequence :: Monad m => SimpleType (m a) -> m (SimpleType a) #

SymbolMatching SimpleType Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal SimpleType 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 (SimpleType a)

Eq a => Eq (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: SimpleType a -> SimpleType a -> Bool #

(/=) :: SimpleType a -> SimpleType a -> Bool #

Ord a => Ord (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (SimpleType a) :: Type -> Type #

Methods

from :: SimpleType a -> Rep (SimpleType a) x #

to :: Rep (SimpleType a) x -> SimpleType a #

Generic1 SimpleType Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 SimpleType :: k -> Type #

type Rep (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 SimpleType Source # 
Instance details

Defined in TreeSitter.Java.AST

newtype Primary a Source #

Instances
Functor Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Primary a -> Primary b #

(<$) :: a -> Primary b -> Primary a #

Foldable Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Primary m -> m #

foldMap :: Monoid m => (a -> m) -> Primary a -> m #

foldr :: (a -> b -> b) -> b -> Primary a -> b #

foldr' :: (a -> b -> b) -> b -> Primary a -> b #

foldl :: (b -> a -> b) -> b -> Primary a -> b #

foldl' :: (b -> a -> b) -> b -> Primary a -> b #

foldr1 :: (a -> a -> a) -> Primary a -> a #

foldl1 :: (a -> a -> a) -> Primary a -> a #

toList :: Primary a -> [a] #

null :: Primary a -> Bool #

length :: Primary a -> Int #

elem :: Eq a => a -> Primary a -> Bool #

maximum :: Ord a => Primary a -> a #

minimum :: Ord a => Primary a -> a #

sum :: Num a => Primary a -> a #

product :: Num a => Primary a -> a #

Traversable Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Primary a -> f (Primary b) #

sequenceA :: Applicative f => Primary (f a) -> f (Primary a) #

mapM :: Monad m => (a -> m b) -> Primary a -> m (Primary b) #

sequence :: Monad m => Primary (m a) -> m (Primary a) #

SymbolMatching Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Primary -> Node -> Bool

showFailure :: Proxy Primary -> Node -> String

Unmarshal Primary 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 (Primary a)

Eq a => Eq (Primary a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Primary a -> Primary a -> Bool #

(/=) :: Primary a -> Primary a -> Bool #

Ord a => Ord (Primary a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Primary a -> Primary a -> Ordering #

(<) :: Primary a -> Primary a -> Bool #

(<=) :: Primary a -> Primary a -> Bool #

(>) :: Primary a -> Primary a -> Bool #

(>=) :: Primary a -> Primary a -> Bool #

max :: Primary a -> Primary a -> Primary a #

min :: Primary a -> Primary a -> Primary a #

Show a => Show (Primary a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Primary a -> ShowS #

show :: Primary a -> String #

showList :: [Primary a] -> ShowS #

Generic (Primary a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Primary a) :: Type -> Type #

Methods

from :: Primary a -> Rep (Primary a) x #

to :: Rep (Primary a) x -> Primary a #

Generic1 Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Primary :: k -> Type #

Methods

from1 :: Primary a -> Rep1 Primary a #

to1 :: Rep1 Primary a -> Primary a #

type Rep (Primary a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

newtype Literal a Source #

Instances
Functor Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Literal a -> Literal b #

(<$) :: a -> Literal b -> Literal a #

Foldable Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Literal m -> m #

foldMap :: Monoid m => (a -> m) -> Literal a -> m #

foldr :: (a -> b -> b) -> b -> Literal a -> b #

foldr' :: (a -> b -> b) -> b -> Literal a -> b #

foldl :: (b -> a -> b) -> b -> Literal a -> b #

foldl' :: (b -> a -> b) -> b -> Literal a -> b #

foldr1 :: (a -> a -> a) -> Literal a -> a #

foldl1 :: (a -> a -> a) -> Literal a -> a #

toList :: Literal a -> [a] #

null :: Literal a -> Bool #

length :: Literal a -> Int #

elem :: Eq a => a -> Literal a -> Bool #

maximum :: Ord a => Literal a -> a #

minimum :: Ord a => Literal a -> a #

sum :: Num a => Literal a -> a #

product :: Num a => Literal a -> a #

Traversable Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Literal a -> f (Literal b) #

sequenceA :: Applicative f => Literal (f a) -> f (Literal a) #

mapM :: Monad m => (a -> m b) -> Literal a -> m (Literal b) #

sequence :: Monad m => Literal (m a) -> m (Literal a) #

SymbolMatching Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

symbolMatch :: Proxy Literal -> Node -> Bool

showFailure :: Proxy Literal -> Node -> String

Unmarshal Literal 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 (Literal a)

Eq a => Eq (Literal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Literal a -> Literal a -> Bool #

(/=) :: Literal a -> Literal a -> Bool #

Ord a => Ord (Literal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

compare :: Literal a -> Literal a -> Ordering #

(<) :: Literal a -> Literal a -> Bool #

(<=) :: Literal a -> Literal a -> Bool #

(>) :: Literal a -> Literal a -> Bool #

(>=) :: Literal a -> Literal a -> Bool #

max :: Literal a -> Literal a -> Literal a #

min :: Literal a -> Literal a -> Literal a #

Show a => Show (Literal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

showsPrec :: Int -> Literal a -> ShowS #

show :: Literal a -> String #

showList :: [Literal a] -> ShowS #

Generic (Literal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Literal a) :: Type -> Type #

Methods

from :: Literal a -> Rep (Literal a) x #

to :: Rep (Literal a) x -> Literal a #

Generic1 Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Literal :: k -> Type #

Methods

from1 :: Literal a -> Rep1 Literal a #

to1 :: Rep1 Literal a -> Literal a #

type Rep (Literal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

newtype Expression a Source #

Instances
Functor Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Expression a -> Expression b #

(<$) :: a -> Expression b -> Expression a #

Foldable Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Expression m -> m #

foldMap :: Monoid m => (a -> m) -> Expression a -> m #

foldr :: (a -> b -> b) -> b -> Expression a -> b #

foldr' :: (a -> b -> b) -> b -> Expression a -> b #

foldl :: (b -> a -> b) -> b -> Expression a -> b #

foldl' :: (b -> a -> b) -> b -> Expression a -> b #

foldr1 :: (a -> a -> a) -> Expression a -> a #

foldl1 :: (a -> a -> a) -> Expression a -> a #

toList :: Expression a -> [a] #

null :: Expression a -> Bool #

length :: Expression a -> Int #

elem :: Eq a => a -> Expression a -> Bool #

maximum :: Ord a => Expression a -> a #

minimum :: Ord a => Expression a -> a #

sum :: Num a => Expression a -> a #

product :: Num a => Expression a -> a #

Traversable Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Expression a -> f (Expression b) #

sequenceA :: Applicative f => Expression (f a) -> f (Expression a) #

mapM :: Monad m => (a -> m b) -> Expression a -> m (Expression b) #

sequence :: Monad m => Expression (m a) -> m (Expression a) #

SymbolMatching Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal Expression 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 (Expression a)

Eq a => Eq (Expression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

(==) :: Expression a -> Expression a -> Bool #

(/=) :: Expression a -> Expression a -> Bool #

Ord a => Ord (Expression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (Expression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (Expression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Expression a) :: Type -> Type #

Methods

from :: Expression a -> Rep (Expression a) x #

to :: Rep (Expression a) x -> Expression a #

Generic1 Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Expression :: k -> Type #

type Rep (Expression a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

newtype Declaration a Source #

Instances
Functor Declaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> Declaration a -> Declaration b #

(<$) :: a -> Declaration b -> Declaration a #

Foldable Declaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => Declaration m -> m #

foldMap :: Monoid m => (a -> m) -> Declaration a -> m #

foldr :: (a -> b -> b) -> b -> Declaration a -> b #

foldr' :: (a -> b -> b) -> b -> Declaration a -> b #

foldl :: (b -> a -> b) -> b -> Declaration a -> b #

foldl' :: (b -> a -> b) -> b -> Declaration a -> b #

foldr1 :: (a -> a -> a) -> Declaration a -> a #

foldl1 :: (a -> a -> a) -> Declaration a -> a #

toList :: Declaration a -> [a] #

null :: Declaration a -> Bool #

length :: Declaration a -> Int #

elem :: Eq a => a -> Declaration a -> Bool #

maximum :: Ord a => Declaration a -> a #

minimum :: Ord a => Declaration a -> a #

sum :: Num a => Declaration a -> a #

product :: Num a => Declaration a -> a #

Traversable Declaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> Declaration a -> f (Declaration b) #

sequenceA :: Applicative f => Declaration (f a) -> f (Declaration a) #

mapM :: Monad m => (a -> m b) -> Declaration a -> m (Declaration b) #

sequence :: Monad m => Declaration (m a) -> m (Declaration a) #

SymbolMatching Declaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal Declaration 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 (Declaration a)

Eq a => Eq (Declaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (Declaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (Declaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (Declaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (Declaration a) :: Type -> Type #

Methods

from :: Declaration a -> Rep (Declaration a) x #

to :: Rep (Declaration a) x -> Declaration a #

Generic1 Declaration Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 Declaration :: k -> Type #

type Rep (Declaration a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Declaration Source # 
Instance details

Defined in TreeSitter.Java.AST