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

Safe HaskellNone
LanguageHaskell2010

TreeSitter.Java.AST

Documentation

newtype AnonymousTilde a Source #

Constructors

AnonymousTilde 

Fields

Instances
Functor AnonymousTilde Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousTilde Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousTilde a -> [a] #

null :: AnonymousTilde a -> Bool #

length :: AnonymousTilde a -> Int #

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

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

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

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

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

Traversable AnonymousTilde Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousTilde Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousTilde a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousTilde Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousTilde :: k -> Type #

type Rep (AnonymousTilde a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousTilde = D1 (MetaData "AnonymousTilde" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousTilde" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRBrace a Source #

Constructors

AnonymousRBrace 

Fields

Instances
Functor AnonymousRBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousRBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousRBrace a -> [a] #

null :: AnonymousRBrace a -> Bool #

length :: AnonymousRBrace a -> Int #

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

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

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

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

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

Traversable AnonymousRBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousRBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousRBrace a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousRBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRBrace :: k -> Type #

type Rep (AnonymousRBrace a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRBrace = D1 (MetaData "AnonymousRBrace" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRBrace" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPipePipe a Source #

Constructors

AnonymousPipePipe 

Fields

Instances
Functor AnonymousPipePipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousPipePipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousPipePipe a -> [a] #

null :: AnonymousPipePipe a -> Bool #

length :: AnonymousPipePipe a -> Int #

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

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

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

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

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

Traversable AnonymousPipePipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousPipePipe Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousPipePipe a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousPipePipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPipePipe :: k -> Type #

type Rep (AnonymousPipePipe a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPipePipe = D1 (MetaData "AnonymousPipePipe" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPipePipe" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPipeEqual a Source #

Constructors

AnonymousPipeEqual 

Fields

Instances
Functor AnonymousPipeEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousPipeEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousPipeEqual a -> [a] #

null :: AnonymousPipeEqual a -> Bool #

length :: AnonymousPipeEqual a -> Int #

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

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

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

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

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

Traversable AnonymousPipeEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousPipeEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousPipeEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousPipeEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPipeEqual :: k -> Type #

type Rep (AnonymousPipeEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPipeEqual = D1 (MetaData "AnonymousPipeEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPipeEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPipe a Source #

Constructors

AnonymousPipe 

Fields

Instances
Functor AnonymousPipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousPipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousPipe a -> [a] #

null :: AnonymousPipe a -> Bool #

length :: AnonymousPipe a -> Int #

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

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

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

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

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

Traversable AnonymousPipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousPipe Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousPipe a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousPipe Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPipe :: k -> Type #

type Rep (AnonymousPipe a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPipe = D1 (MetaData "AnonymousPipe" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPipe" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLBrace a Source #

Constructors

AnonymousLBrace 

Fields

Instances
Functor AnonymousLBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousLBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousLBrace a -> [a] #

null :: AnonymousLBrace a -> Bool #

length :: AnonymousLBrace a -> Int #

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

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

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

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

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

Traversable AnonymousLBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousLBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousLBrace a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousLBrace Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLBrace :: k -> Type #

type Rep (AnonymousLBrace a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLBrace = D1 (MetaData "AnonymousLBrace" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLBrace" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousWith a Source #

Constructors

AnonymousWith 

Fields

Instances
Functor AnonymousWith Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousWith Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousWith a -> [a] #

null :: AnonymousWith a -> Bool #

length :: AnonymousWith a -> Int #

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

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

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

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

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

Traversable AnonymousWith Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousWith Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousWith a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousWith Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousWith :: k -> Type #

type Rep (AnonymousWith a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousWith = D1 (MetaData "AnonymousWith" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousWith" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousWhile a Source #

Constructors

AnonymousWhile 

Fields

Instances
Functor AnonymousWhile Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousWhile Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousWhile a -> [a] #

null :: AnonymousWhile a -> Bool #

length :: AnonymousWhile a -> Int #

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

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

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

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

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

Traversable AnonymousWhile Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousWhile Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousWhile a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousWhile Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousWhile :: k -> Type #

type Rep (AnonymousWhile a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousWhile = D1 (MetaData "AnonymousWhile" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousWhile" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousVolatile a Source #

Constructors

AnonymousVolatile 

Fields

Instances
Functor AnonymousVolatile Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousVolatile Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousVolatile a -> [a] #

null :: AnonymousVolatile a -> Bool #

length :: AnonymousVolatile a -> Int #

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

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

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

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

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

Traversable AnonymousVolatile Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousVolatile Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousVolatile a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousVolatile Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousVolatile :: k -> Type #

type Rep (AnonymousVolatile a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousVolatile = D1 (MetaData "AnonymousVolatile" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousVolatile" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "VoidType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "VoidType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousUses a Source #

Constructors

AnonymousUses 

Fields

Instances
Functor AnonymousUses Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousUses Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousUses a -> [a] #

null :: AnonymousUses a -> Bool #

length :: AnonymousUses a -> Int #

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

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

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

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

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

Traversable AnonymousUses Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousUses Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousUses a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousUses Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousUses :: k -> Type #

type Rep (AnonymousUses a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousUses = D1 (MetaData "AnonymousUses" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousUses" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "TypeIdentifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "TypeIdentifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousTry a Source #

Constructors

AnonymousTry 

Fields

Instances
Functor AnonymousTry Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousTry Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousTry a -> [a] #

null :: AnonymousTry a -> Bool #

length :: AnonymousTry a -> Int #

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

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

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

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

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

Traversable AnonymousTry Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousTry Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousTry a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 AnonymousTry Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousTry :: k -> Type #

type Rep (AnonymousTry a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousTry = D1 (MetaData "AnonymousTry" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousTry" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "True" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "True" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousTransitive a Source #

Constructors

AnonymousTransitive 

Fields

Instances
Functor AnonymousTransitive Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousTransitive Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousTransitive a -> [a] #

null :: AnonymousTransitive a -> Bool #

length :: AnonymousTransitive a -> Int #

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

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

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

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

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

Traversable AnonymousTransitive Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousTransitive Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousTransitive a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousTransitive Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousTransitive :: k -> Type #

type Rep (AnonymousTransitive a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousTransitive = D1 (MetaData "AnonymousTransitive" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousTransitive" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousTransient a Source #

Constructors

AnonymousTransient 

Fields

Instances
Functor AnonymousTransient Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousTransient Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousTransient a -> [a] #

null :: AnonymousTransient a -> Bool #

length :: AnonymousTransient a -> Int #

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

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

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

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

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

Traversable AnonymousTransient Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousTransient Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousTransient a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousTransient Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousTransient :: k -> Type #

type Rep (AnonymousTransient a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousTransient = D1 (MetaData "AnonymousTransient" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousTransient" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousTo a Source #

Constructors

AnonymousTo 

Fields

Instances
Functor AnonymousTo Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousTo Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousTo a -> [a] #

null :: AnonymousTo a -> Bool #

length :: AnonymousTo a -> Int #

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

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

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

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

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

Traversable AnonymousTo Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousTo Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousTo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 AnonymousTo Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousTo :: k -> Type #

type Rep (AnonymousTo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousTo = D1 (MetaData "AnonymousTo" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousTo" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousThrows a Source #

Constructors

AnonymousThrows 

Fields

Instances
Functor AnonymousThrows Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousThrows Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousThrows a -> [a] #

null :: AnonymousThrows a -> Bool #

length :: AnonymousThrows a -> Int #

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

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

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

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

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

Traversable AnonymousThrows Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousThrows Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousThrows a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousThrows Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousThrows :: k -> Type #

type Rep (AnonymousThrows a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousThrows = D1 (MetaData "AnonymousThrows" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousThrows" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousThrow a Source #

Constructors

AnonymousThrow 

Fields

Instances
Functor AnonymousThrow Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousThrow Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousThrow a -> [a] #

null :: AnonymousThrow a -> Bool #

length :: AnonymousThrow a -> Int #

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

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

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

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

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

Traversable AnonymousThrow Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousThrow Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousThrow a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousThrow Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousThrow :: k -> Type #

type Rep (AnonymousThrow a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousThrow = D1 (MetaData "AnonymousThrow" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousThrow" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "This" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "This" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousSynchronized a Source #

Constructors

AnonymousSynchronized 

Fields

Instances
Functor AnonymousSynchronized Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousSynchronized Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousSynchronized a -> [a] #

null :: AnonymousSynchronized a -> Bool #

length :: AnonymousSynchronized a -> Int #

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

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

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

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

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

Traversable AnonymousSynchronized Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousSynchronized Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousSynchronized a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousSynchronized Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousSynchronized :: k -> Type #

type Rep (AnonymousSynchronized a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousSynchronized = D1 (MetaData "AnonymousSynchronized" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSynchronized" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousSwitch a Source #

Constructors

AnonymousSwitch 

Fields

Instances
Functor AnonymousSwitch Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousSwitch Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousSwitch a -> [a] #

null :: AnonymousSwitch a -> Bool #

length :: AnonymousSwitch a -> Int #

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

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

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

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

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

Traversable AnonymousSwitch Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousSwitch Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousSwitch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousSwitch Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousSwitch :: k -> Type #

type Rep (AnonymousSwitch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousSwitch = D1 (MetaData "AnonymousSwitch" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSwitch" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "Super" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "Super" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "StringLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "StringLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousStrictfp a Source #

Constructors

AnonymousStrictfp 

Fields

Instances
Functor AnonymousStrictfp Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousStrictfp Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousStrictfp a -> [a] #

null :: AnonymousStrictfp a -> Bool #

length :: AnonymousStrictfp a -> Int #

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

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

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

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

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

Traversable AnonymousStrictfp Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousStrictfp Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousStrictfp a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousStrictfp Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousStrictfp :: k -> Type #

type Rep (AnonymousStrictfp a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousStrictfp = D1 (MetaData "AnonymousStrictfp" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousStrictfp" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousStatic a Source #

Constructors

AnonymousStatic 

Fields

Instances
Functor AnonymousStatic Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousStatic Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousStatic a -> [a] #

null :: AnonymousStatic a -> Bool #

length :: AnonymousStatic a -> Int #

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

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

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

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

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

Traversable AnonymousStatic Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousStatic Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousStatic a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousStatic Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousStatic :: k -> Type #

type Rep (AnonymousStatic a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousStatic = D1 (MetaData "AnonymousStatic" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousStatic" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousShort a Source #

Constructors

AnonymousShort 

Fields

Instances
Functor AnonymousShort Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousShort Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousShort a -> [a] #

null :: AnonymousShort a -> Bool #

length :: AnonymousShort a -> Int #

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

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

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

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

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

Traversable AnonymousShort Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousShort Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousShort a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousShort Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousShort :: k -> Type #

type Rep (AnonymousShort a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousShort = D1 (MetaData "AnonymousShort" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousShort" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousReturn a Source #

Constructors

AnonymousReturn 

Fields

Instances
Functor AnonymousReturn Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousReturn Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousReturn a -> [a] #

null :: AnonymousReturn a -> Bool #

length :: AnonymousReturn a -> Int #

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

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

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

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

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

Traversable AnonymousReturn Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousReturn Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousReturn a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousReturn Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousReturn :: k -> Type #

type Rep (AnonymousReturn a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousReturn = D1 (MetaData "AnonymousReturn" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousReturn" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRequires a Source #

Constructors

AnonymousRequires 

Fields

Instances
Functor AnonymousRequires Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRequires Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousRequires a -> [a] #

null :: AnonymousRequires a -> Bool #

length :: AnonymousRequires a -> Int #

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

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

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

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

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

Traversable AnonymousRequires Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousRequires Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousRequires a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousRequires Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRequires :: k -> Type #

type Rep (AnonymousRequires a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRequires = D1 (MetaData "AnonymousRequires" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRequires" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPublic a Source #

Constructors

AnonymousPublic 

Fields

Instances
Functor AnonymousPublic Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousPublic Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousPublic a -> [a] #

null :: AnonymousPublic a -> Bool #

length :: AnonymousPublic a -> Int #

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

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

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

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

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

Traversable AnonymousPublic Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousPublic Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousPublic a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousPublic Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPublic :: k -> Type #

type Rep (AnonymousPublic a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPublic = D1 (MetaData "AnonymousPublic" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPublic" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousProvides a Source #

Constructors

AnonymousProvides 

Fields

Instances
Functor AnonymousProvides Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousProvides Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousProvides a -> [a] #

null :: AnonymousProvides a -> Bool #

length :: AnonymousProvides a -> Int #

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

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

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

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

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

Traversable AnonymousProvides Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousProvides Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousProvides a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousProvides Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousProvides :: k -> Type #

type Rep (AnonymousProvides a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousProvides = D1 (MetaData "AnonymousProvides" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousProvides" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousProtected a Source #

Constructors

AnonymousProtected 

Fields

Instances
Functor AnonymousProtected Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousProtected Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousProtected a -> [a] #

null :: AnonymousProtected a -> Bool #

length :: AnonymousProtected a -> Int #

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

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

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

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

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

Traversable AnonymousProtected Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousProtected Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousProtected a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousProtected Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousProtected :: k -> Type #

type Rep (AnonymousProtected a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousProtected = D1 (MetaData "AnonymousProtected" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousProtected" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPrivate a Source #

Constructors

AnonymousPrivate 

Fields

Instances
Functor AnonymousPrivate Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousPrivate Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousPrivate a -> [a] #

null :: AnonymousPrivate a -> Bool #

length :: AnonymousPrivate a -> Int #

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

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

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

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

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

Traversable AnonymousPrivate Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousPrivate Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousPrivate a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousPrivate Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPrivate :: k -> Type #

type Rep (AnonymousPrivate a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPrivate = D1 (MetaData "AnonymousPrivate" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPrivate" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPackage a Source #

Constructors

AnonymousPackage 

Fields

Instances
Functor AnonymousPackage Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousPackage Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousPackage a -> [a] #

null :: AnonymousPackage a -> Bool #

length :: AnonymousPackage a -> Int #

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

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

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

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

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

Traversable AnonymousPackage Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousPackage Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousPackage a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousPackage Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPackage :: k -> Type #

type Rep (AnonymousPackage a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPackage = D1 (MetaData "AnonymousPackage" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPackage" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousOpens a Source #

Constructors

AnonymousOpens 

Fields

Instances
Functor AnonymousOpens Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousOpens Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousOpens a -> [a] #

null :: AnonymousOpens a -> Bool #

length :: AnonymousOpens a -> Int #

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

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

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

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

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

Traversable AnonymousOpens Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousOpens Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousOpens a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousOpens Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousOpens :: k -> Type #

type Rep (AnonymousOpens a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousOpens = D1 (MetaData "AnonymousOpens" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousOpens" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousOpen a Source #

Constructors

AnonymousOpen 

Fields

Instances
Functor AnonymousOpen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousOpen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousOpen a -> [a] #

null :: AnonymousOpen a -> Bool #

length :: AnonymousOpen a -> Int #

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

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

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

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

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

Traversable AnonymousOpen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousOpen Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousOpen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousOpen Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousOpen :: k -> Type #

type Rep (AnonymousOpen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousOpen = D1 (MetaData "AnonymousOpen" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousOpen" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "OctalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "OctalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "NullLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "NullLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousNew a Source #

Constructors

AnonymousNew 

Fields

Instances
Functor AnonymousNew Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousNew Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousNew a -> [a] #

null :: AnonymousNew a -> Bool #

length :: AnonymousNew a -> Int #

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

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

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

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

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

Traversable AnonymousNew Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousNew Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousNew a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Methods

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

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

Generic1 AnonymousNew Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousNew :: k -> Type #

type Rep (AnonymousNew a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousNew = D1 (MetaData "AnonymousNew" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousNew" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousNative a Source #

Constructors

AnonymousNative 

Fields

Instances
Functor AnonymousNative Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousNative Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousNative a -> [a] #

null :: AnonymousNative a -> Bool #

length :: AnonymousNative a -> Int #

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

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

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

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

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

Traversable AnonymousNative Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousNative Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousNative a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousNative Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousNative :: k -> Type #

type Rep (AnonymousNative a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousNative = D1 (MetaData "AnonymousNative" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousNative" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousModule a Source #

Constructors

AnonymousModule 

Fields

Instances
Functor AnonymousModule Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousModule Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

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

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

toList :: AnonymousModule a -> [a] #

null :: AnonymousModule a -> Bool #

length :: AnonymousModule a -> Int #

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

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

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

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

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

Traversable AnonymousModule Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

SymbolMatching AnonymousModule Source # 
Instance details

Defined in TreeSitter.Java.AST

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

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

Generic (AnonymousModule a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

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

Generic1 AnonymousModule Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousModule :: k -> Type #

type Rep (AnonymousModule a) Source # 
Instance details

Defined in TreeSitter.Java.AST

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

Defined in TreeSitter.Java.AST

type Rep1 AnonymousModule = D1 (MetaData "AnonymousModule" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousModule" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLong a Source #

Constructors

AnonymousLong 

Fields

Instances
Functor AnonymousLong Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

Foldable AnonymousLong Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

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

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

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

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

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

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

foldr1 :: (a -> a -> a) -> AnonymousLong a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLong a -> a #

toList :: AnonymousLong a -> [a] #

null :: AnonymousLong a -> Bool #

length :: AnonymousLong a -> Int #

elem :: Eq a => a -> AnonymousLong a -> Bool #

maximum :: Ord a => AnonymousLong a -> a #

minimum :: Ord a => AnonymousLong a -> a #

sum :: Num a => AnonymousLong a -> a #

product :: Num a => AnonymousLong a -> a #

Traversable AnonymousLong Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousLong a -> f (AnonymousLong b) #

sequenceA :: Applicative f => AnonymousLong (f a) -> f (AnonymousLong a) #

mapM :: Monad m => (a -> m b) -> AnonymousLong a -> m (AnonymousLong b) #

sequence :: Monad m => AnonymousLong (m a) -> m (AnonymousLong a) #

SymbolMatching AnonymousLong Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLong 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 (AnonymousLong a)

Eq a => Eq (AnonymousLong a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLong a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLong a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLong a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLong a) :: Type -> Type #

Generic1 AnonymousLong Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLong :: k -> Type #

type Rep (AnonymousLong a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLong a) = D1 (MetaData "AnonymousLong" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLong" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLong Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLong = D1 (MetaData "AnonymousLong" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLong" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousInterface a Source #

Constructors

AnonymousInterface 

Fields

Instances
Functor AnonymousInterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousInterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousInterface m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousInterface a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousInterface a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousInterface a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousInterface a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousInterface a -> b #

foldr1 :: (a -> a -> a) -> AnonymousInterface a -> a #

foldl1 :: (a -> a -> a) -> AnonymousInterface a -> a #

toList :: AnonymousInterface a -> [a] #

null :: AnonymousInterface a -> Bool #

length :: AnonymousInterface a -> Int #

elem :: Eq a => a -> AnonymousInterface a -> Bool #

maximum :: Ord a => AnonymousInterface a -> a #

minimum :: Ord a => AnonymousInterface a -> a #

sum :: Num a => AnonymousInterface a -> a #

product :: Num a => AnonymousInterface a -> a #

Traversable AnonymousInterface Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousInterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousInterface 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 (AnonymousInterface a)

Eq a => Eq (AnonymousInterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousInterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousInterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousInterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousInterface a) :: Type -> Type #

Generic1 AnonymousInterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousInterface :: k -> Type #

type Rep (AnonymousInterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousInterface a) = D1 (MetaData "AnonymousInterface" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousInterface" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousInterface Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousInterface = D1 (MetaData "AnonymousInterface" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousInterface" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousInt a Source #

Constructors

AnonymousInt 

Fields

Instances
Functor AnonymousInt Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousInt a -> AnonymousInt b #

(<$) :: a -> AnonymousInt b -> AnonymousInt a #

Foldable AnonymousInt Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousInt m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousInt a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousInt a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousInt a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousInt a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousInt a -> b #

foldr1 :: (a -> a -> a) -> AnonymousInt a -> a #

foldl1 :: (a -> a -> a) -> AnonymousInt a -> a #

toList :: AnonymousInt a -> [a] #

null :: AnonymousInt a -> Bool #

length :: AnonymousInt a -> Int #

elem :: Eq a => a -> AnonymousInt a -> Bool #

maximum :: Ord a => AnonymousInt a -> a #

minimum :: Ord a => AnonymousInt a -> a #

sum :: Num a => AnonymousInt a -> a #

product :: Num a => AnonymousInt a -> a #

Traversable AnonymousInt Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousInt a -> f (AnonymousInt b) #

sequenceA :: Applicative f => AnonymousInt (f a) -> f (AnonymousInt a) #

mapM :: Monad m => (a -> m b) -> AnonymousInt a -> m (AnonymousInt b) #

sequence :: Monad m => AnonymousInt (m a) -> m (AnonymousInt a) #

SymbolMatching AnonymousInt Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousInt 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 (AnonymousInt a)

Eq a => Eq (AnonymousInt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousInt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousInt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousInt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousInt a) :: Type -> Type #

Methods

from :: AnonymousInt a -> Rep (AnonymousInt a) x #

to :: Rep (AnonymousInt a) x -> AnonymousInt a #

Generic1 AnonymousInt Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousInt :: k -> Type #

type Rep (AnonymousInt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousInt a) = D1 (MetaData "AnonymousInt" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousInt" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousInt Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousInt = D1 (MetaData "AnonymousInt" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousInt" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousInstanceof a Source #

Constructors

AnonymousInstanceof 

Fields

Instances
Functor AnonymousInstanceof Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousInstanceof Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousInstanceof m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousInstanceof a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousInstanceof a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousInstanceof a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousInstanceof a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousInstanceof a -> b #

foldr1 :: (a -> a -> a) -> AnonymousInstanceof a -> a #

foldl1 :: (a -> a -> a) -> AnonymousInstanceof a -> a #

toList :: AnonymousInstanceof a -> [a] #

null :: AnonymousInstanceof a -> Bool #

length :: AnonymousInstanceof a -> Int #

elem :: Eq a => a -> AnonymousInstanceof a -> Bool #

maximum :: Ord a => AnonymousInstanceof a -> a #

minimum :: Ord a => AnonymousInstanceof a -> a #

sum :: Num a => AnonymousInstanceof a -> a #

product :: Num a => AnonymousInstanceof a -> a #

Traversable AnonymousInstanceof Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousInstanceof Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousInstanceof 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 (AnonymousInstanceof a)

Eq a => Eq (AnonymousInstanceof a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousInstanceof a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousInstanceof a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousInstanceof a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousInstanceof a) :: Type -> Type #

Generic1 AnonymousInstanceof Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousInstanceof :: k -> Type #

type Rep (AnonymousInstanceof a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousInstanceof a) = D1 (MetaData "AnonymousInstanceof" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousInstanceof" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousInstanceof Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousInstanceof = D1 (MetaData "AnonymousInstanceof" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousInstanceof" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousImport a Source #

Constructors

AnonymousImport 

Fields

Instances
Functor AnonymousImport Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousImport a -> AnonymousImport b #

(<$) :: a -> AnonymousImport b -> AnonymousImport a #

Foldable AnonymousImport Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousImport m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousImport a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousImport a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousImport a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousImport a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousImport a -> b #

foldr1 :: (a -> a -> a) -> AnonymousImport a -> a #

foldl1 :: (a -> a -> a) -> AnonymousImport a -> a #

toList :: AnonymousImport a -> [a] #

null :: AnonymousImport a -> Bool #

length :: AnonymousImport a -> Int #

elem :: Eq a => a -> AnonymousImport a -> Bool #

maximum :: Ord a => AnonymousImport a -> a #

minimum :: Ord a => AnonymousImport a -> a #

sum :: Num a => AnonymousImport a -> a #

product :: Num a => AnonymousImport a -> a #

Traversable AnonymousImport Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousImport a -> f (AnonymousImport b) #

sequenceA :: Applicative f => AnonymousImport (f a) -> f (AnonymousImport a) #

mapM :: Monad m => (a -> m b) -> AnonymousImport a -> m (AnonymousImport b) #

sequence :: Monad m => AnonymousImport (m a) -> m (AnonymousImport a) #

SymbolMatching AnonymousImport Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousImport 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 (AnonymousImport a)

Eq a => Eq (AnonymousImport a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousImport a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousImport a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousImport a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousImport a) :: Type -> Type #

Generic1 AnonymousImport Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousImport :: k -> Type #

type Rep (AnonymousImport a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousImport a) = D1 (MetaData "AnonymousImport" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousImport" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousImport Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousImport = D1 (MetaData "AnonymousImport" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousImport" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousImplements a Source #

Constructors

AnonymousImplements 

Fields

Instances
Functor AnonymousImplements Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousImplements Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousImplements m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousImplements a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousImplements a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousImplements a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousImplements a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousImplements a -> b #

foldr1 :: (a -> a -> a) -> AnonymousImplements a -> a #

foldl1 :: (a -> a -> a) -> AnonymousImplements a -> a #

toList :: AnonymousImplements a -> [a] #

null :: AnonymousImplements a -> Bool #

length :: AnonymousImplements a -> Int #

elem :: Eq a => a -> AnonymousImplements a -> Bool #

maximum :: Ord a => AnonymousImplements a -> a #

minimum :: Ord a => AnonymousImplements a -> a #

sum :: Num a => AnonymousImplements a -> a #

product :: Num a => AnonymousImplements a -> a #

Traversable AnonymousImplements Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousImplements Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousImplements 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 (AnonymousImplements a)

Eq a => Eq (AnonymousImplements a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousImplements a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousImplements a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousImplements a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousImplements a) :: Type -> Type #

Generic1 AnonymousImplements Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousImplements :: k -> Type #

type Rep (AnonymousImplements a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousImplements a) = D1 (MetaData "AnonymousImplements" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousImplements" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousImplements Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousImplements = D1 (MetaData "AnonymousImplements" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousImplements" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousIf a Source #

Constructors

AnonymousIf 

Fields

Instances
Functor AnonymousIf Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousIf a -> AnonymousIf b #

(<$) :: a -> AnonymousIf b -> AnonymousIf a #

Foldable AnonymousIf Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousIf m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousIf a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousIf a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousIf a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousIf a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousIf a -> b #

foldr1 :: (a -> a -> a) -> AnonymousIf a -> a #

foldl1 :: (a -> a -> a) -> AnonymousIf a -> a #

toList :: AnonymousIf a -> [a] #

null :: AnonymousIf a -> Bool #

length :: AnonymousIf a -> Int #

elem :: Eq a => a -> AnonymousIf a -> Bool #

maximum :: Ord a => AnonymousIf a -> a #

minimum :: Ord a => AnonymousIf a -> a #

sum :: Num a => AnonymousIf a -> a #

product :: Num a => AnonymousIf a -> a #

Traversable AnonymousIf Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousIf a -> f (AnonymousIf b) #

sequenceA :: Applicative f => AnonymousIf (f a) -> f (AnonymousIf a) #

mapM :: Monad m => (a -> m b) -> AnonymousIf a -> m (AnonymousIf b) #

sequence :: Monad m => AnonymousIf (m a) -> m (AnonymousIf a) #

SymbolMatching AnonymousIf Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousIf 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 (AnonymousIf a)

Eq a => Eq (AnonymousIf a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousIf a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousIf a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousIf a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousIf a) :: Type -> Type #

Methods

from :: AnonymousIf a -> Rep (AnonymousIf a) x #

to :: Rep (AnonymousIf a) x -> AnonymousIf a #

Generic1 AnonymousIf Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousIf :: k -> Type #

type Rep (AnonymousIf a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousIf a) = D1 (MetaData "AnonymousIf" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousIf" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousIf Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousIf = D1 (MetaData "AnonymousIf" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousIf" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "Identifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "Identifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "HexIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "HexIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "HexFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "HexFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousFor a Source #

Constructors

AnonymousFor 

Fields

Instances
Functor AnonymousFor Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousFor a -> AnonymousFor b #

(<$) :: a -> AnonymousFor b -> AnonymousFor a #

Foldable AnonymousFor Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousFor m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousFor a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousFor a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousFor a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousFor a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousFor a -> b #

foldr1 :: (a -> a -> a) -> AnonymousFor a -> a #

foldl1 :: (a -> a -> a) -> AnonymousFor a -> a #

toList :: AnonymousFor a -> [a] #

null :: AnonymousFor a -> Bool #

length :: AnonymousFor a -> Int #

elem :: Eq a => a -> AnonymousFor a -> Bool #

maximum :: Ord a => AnonymousFor a -> a #

minimum :: Ord a => AnonymousFor a -> a #

sum :: Num a => AnonymousFor a -> a #

product :: Num a => AnonymousFor a -> a #

Traversable AnonymousFor Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousFor a -> f (AnonymousFor b) #

sequenceA :: Applicative f => AnonymousFor (f a) -> f (AnonymousFor a) #

mapM :: Monad m => (a -> m b) -> AnonymousFor a -> m (AnonymousFor b) #

sequence :: Monad m => AnonymousFor (m a) -> m (AnonymousFor a) #

SymbolMatching AnonymousFor Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousFor 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 (AnonymousFor a)

Eq a => Eq (AnonymousFor a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousFor a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousFor a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousFor a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousFor a) :: Type -> Type #

Methods

from :: AnonymousFor a -> Rep (AnonymousFor a) x #

to :: Rep (AnonymousFor a) x -> AnonymousFor a #

Generic1 AnonymousFor Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousFor :: k -> Type #

type Rep (AnonymousFor a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousFor a) = D1 (MetaData "AnonymousFor" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFor" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousFor Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousFor = D1 (MetaData "AnonymousFor" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFor" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousFloat a Source #

Constructors

AnonymousFloat 

Fields

Instances
Functor AnonymousFloat Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousFloat a -> AnonymousFloat b #

(<$) :: a -> AnonymousFloat b -> AnonymousFloat a #

Foldable AnonymousFloat Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousFloat m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousFloat a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousFloat a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousFloat a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousFloat a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousFloat a -> b #

foldr1 :: (a -> a -> a) -> AnonymousFloat a -> a #

foldl1 :: (a -> a -> a) -> AnonymousFloat a -> a #

toList :: AnonymousFloat a -> [a] #

null :: AnonymousFloat a -> Bool #

length :: AnonymousFloat a -> Int #

elem :: Eq a => a -> AnonymousFloat a -> Bool #

maximum :: Ord a => AnonymousFloat a -> a #

minimum :: Ord a => AnonymousFloat a -> a #

sum :: Num a => AnonymousFloat a -> a #

product :: Num a => AnonymousFloat a -> a #

Traversable AnonymousFloat Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousFloat a -> f (AnonymousFloat b) #

sequenceA :: Applicative f => AnonymousFloat (f a) -> f (AnonymousFloat a) #

mapM :: Monad m => (a -> m b) -> AnonymousFloat a -> m (AnonymousFloat b) #

sequence :: Monad m => AnonymousFloat (m a) -> m (AnonymousFloat a) #

SymbolMatching AnonymousFloat Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousFloat 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 (AnonymousFloat a)

Eq a => Eq (AnonymousFloat a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousFloat a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousFloat a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousFloat a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousFloat a) :: Type -> Type #

Generic1 AnonymousFloat Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousFloat :: k -> Type #

type Rep (AnonymousFloat a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousFloat a) = D1 (MetaData "AnonymousFloat" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFloat" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousFloat Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousFloat = D1 (MetaData "AnonymousFloat" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFloat" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousFinally a Source #

Constructors

AnonymousFinally 

Fields

Instances
Functor AnonymousFinally Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousFinally a -> AnonymousFinally b #

(<$) :: a -> AnonymousFinally b -> AnonymousFinally a #

Foldable AnonymousFinally Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousFinally m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousFinally a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousFinally a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousFinally a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousFinally a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousFinally a -> b #

foldr1 :: (a -> a -> a) -> AnonymousFinally a -> a #

foldl1 :: (a -> a -> a) -> AnonymousFinally a -> a #

toList :: AnonymousFinally a -> [a] #

null :: AnonymousFinally a -> Bool #

length :: AnonymousFinally a -> Int #

elem :: Eq a => a -> AnonymousFinally a -> Bool #

maximum :: Ord a => AnonymousFinally a -> a #

minimum :: Ord a => AnonymousFinally a -> a #

sum :: Num a => AnonymousFinally a -> a #

product :: Num a => AnonymousFinally a -> a #

Traversable AnonymousFinally Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousFinally a -> f (AnonymousFinally b) #

sequenceA :: Applicative f => AnonymousFinally (f a) -> f (AnonymousFinally a) #

mapM :: Monad m => (a -> m b) -> AnonymousFinally a -> m (AnonymousFinally b) #

sequence :: Monad m => AnonymousFinally (m a) -> m (AnonymousFinally a) #

SymbolMatching AnonymousFinally Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousFinally 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 (AnonymousFinally a)

Eq a => Eq (AnonymousFinally a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousFinally a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousFinally a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousFinally a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousFinally a) :: Type -> Type #

Generic1 AnonymousFinally Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousFinally :: k -> Type #

type Rep (AnonymousFinally a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousFinally a) = D1 (MetaData "AnonymousFinally" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFinally" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousFinally Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousFinally = D1 (MetaData "AnonymousFinally" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFinally" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousFinal a Source #

Constructors

AnonymousFinal 

Fields

Instances
Functor AnonymousFinal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousFinal a -> AnonymousFinal b #

(<$) :: a -> AnonymousFinal b -> AnonymousFinal a #

Foldable AnonymousFinal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousFinal m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousFinal a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousFinal a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousFinal a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousFinal a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousFinal a -> b #

foldr1 :: (a -> a -> a) -> AnonymousFinal a -> a #

foldl1 :: (a -> a -> a) -> AnonymousFinal a -> a #

toList :: AnonymousFinal a -> [a] #

null :: AnonymousFinal a -> Bool #

length :: AnonymousFinal a -> Int #

elem :: Eq a => a -> AnonymousFinal a -> Bool #

maximum :: Ord a => AnonymousFinal a -> a #

minimum :: Ord a => AnonymousFinal a -> a #

sum :: Num a => AnonymousFinal a -> a #

product :: Num a => AnonymousFinal a -> a #

Traversable AnonymousFinal Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousFinal a -> f (AnonymousFinal b) #

sequenceA :: Applicative f => AnonymousFinal (f a) -> f (AnonymousFinal a) #

mapM :: Monad m => (a -> m b) -> AnonymousFinal a -> m (AnonymousFinal b) #

sequence :: Monad m => AnonymousFinal (m a) -> m (AnonymousFinal a) #

SymbolMatching AnonymousFinal Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousFinal 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 (AnonymousFinal a)

Eq a => Eq (AnonymousFinal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousFinal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousFinal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousFinal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousFinal a) :: Type -> Type #

Generic1 AnonymousFinal Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousFinal :: k -> Type #

type Rep (AnonymousFinal a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousFinal a) = D1 (MetaData "AnonymousFinal" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFinal" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousFinal Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousFinal = D1 (MetaData "AnonymousFinal" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousFinal" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "False" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "False" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousExtends a Source #

Constructors

AnonymousExtends 

Fields

Instances
Functor AnonymousExtends Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousExtends a -> AnonymousExtends b #

(<$) :: a -> AnonymousExtends b -> AnonymousExtends a #

Foldable AnonymousExtends Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousExtends m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousExtends a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousExtends a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousExtends a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousExtends a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousExtends a -> b #

foldr1 :: (a -> a -> a) -> AnonymousExtends a -> a #

foldl1 :: (a -> a -> a) -> AnonymousExtends a -> a #

toList :: AnonymousExtends a -> [a] #

null :: AnonymousExtends a -> Bool #

length :: AnonymousExtends a -> Int #

elem :: Eq a => a -> AnonymousExtends a -> Bool #

maximum :: Ord a => AnonymousExtends a -> a #

minimum :: Ord a => AnonymousExtends a -> a #

sum :: Num a => AnonymousExtends a -> a #

product :: Num a => AnonymousExtends a -> a #

Traversable AnonymousExtends Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousExtends a -> f (AnonymousExtends b) #

sequenceA :: Applicative f => AnonymousExtends (f a) -> f (AnonymousExtends a) #

mapM :: Monad m => (a -> m b) -> AnonymousExtends a -> m (AnonymousExtends b) #

sequence :: Monad m => AnonymousExtends (m a) -> m (AnonymousExtends a) #

SymbolMatching AnonymousExtends Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousExtends 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 (AnonymousExtends a)

Eq a => Eq (AnonymousExtends a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousExtends a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousExtends a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousExtends a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousExtends a) :: Type -> Type #

Generic1 AnonymousExtends Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousExtends :: k -> Type #

type Rep (AnonymousExtends a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousExtends a) = D1 (MetaData "AnonymousExtends" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousExtends" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousExtends Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousExtends = D1 (MetaData "AnonymousExtends" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousExtends" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousExports a Source #

Constructors

AnonymousExports 

Fields

Instances
Functor AnonymousExports Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousExports a -> AnonymousExports b #

(<$) :: a -> AnonymousExports b -> AnonymousExports a #

Foldable AnonymousExports Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousExports m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousExports a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousExports a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousExports a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousExports a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousExports a -> b #

foldr1 :: (a -> a -> a) -> AnonymousExports a -> a #

foldl1 :: (a -> a -> a) -> AnonymousExports a -> a #

toList :: AnonymousExports a -> [a] #

null :: AnonymousExports a -> Bool #

length :: AnonymousExports a -> Int #

elem :: Eq a => a -> AnonymousExports a -> Bool #

maximum :: Ord a => AnonymousExports a -> a #

minimum :: Ord a => AnonymousExports a -> a #

sum :: Num a => AnonymousExports a -> a #

product :: Num a => AnonymousExports a -> a #

Traversable AnonymousExports Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousExports a -> f (AnonymousExports b) #

sequenceA :: Applicative f => AnonymousExports (f a) -> f (AnonymousExports a) #

mapM :: Monad m => (a -> m b) -> AnonymousExports a -> m (AnonymousExports b) #

sequence :: Monad m => AnonymousExports (m a) -> m (AnonymousExports a) #

SymbolMatching AnonymousExports Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousExports 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 (AnonymousExports a)

Eq a => Eq (AnonymousExports a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousExports a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousExports a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousExports a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousExports a) :: Type -> Type #

Generic1 AnonymousExports Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousExports :: k -> Type #

type Rep (AnonymousExports a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousExports a) = D1 (MetaData "AnonymousExports" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousExports" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousExports Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousExports = D1 (MetaData "AnonymousExports" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousExports" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousEnum a Source #

Constructors

AnonymousEnum 

Fields

Instances
Functor AnonymousEnum Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousEnum a -> AnonymousEnum b #

(<$) :: a -> AnonymousEnum b -> AnonymousEnum a #

Foldable AnonymousEnum Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousEnum m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousEnum a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousEnum a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousEnum a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousEnum a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousEnum a -> b #

foldr1 :: (a -> a -> a) -> AnonymousEnum a -> a #

foldl1 :: (a -> a -> a) -> AnonymousEnum a -> a #

toList :: AnonymousEnum a -> [a] #

null :: AnonymousEnum a -> Bool #

length :: AnonymousEnum a -> Int #

elem :: Eq a => a -> AnonymousEnum a -> Bool #

maximum :: Ord a => AnonymousEnum a -> a #

minimum :: Ord a => AnonymousEnum a -> a #

sum :: Num a => AnonymousEnum a -> a #

product :: Num a => AnonymousEnum a -> a #

Traversable AnonymousEnum Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousEnum a -> f (AnonymousEnum b) #

sequenceA :: Applicative f => AnonymousEnum (f a) -> f (AnonymousEnum a) #

mapM :: Monad m => (a -> m b) -> AnonymousEnum a -> m (AnonymousEnum b) #

sequence :: Monad m => AnonymousEnum (m a) -> m (AnonymousEnum a) #

SymbolMatching AnonymousEnum Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousEnum 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 (AnonymousEnum a)

Eq a => Eq (AnonymousEnum a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousEnum a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousEnum a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousEnum a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousEnum a) :: Type -> Type #

Generic1 AnonymousEnum Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousEnum :: k -> Type #

type Rep (AnonymousEnum a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousEnum a) = D1 (MetaData "AnonymousEnum" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousEnum" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousEnum Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousEnum = D1 (MetaData "AnonymousEnum" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousEnum" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousElse a Source #

Constructors

AnonymousElse 

Fields

Instances
Functor AnonymousElse Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousElse a -> AnonymousElse b #

(<$) :: a -> AnonymousElse b -> AnonymousElse a #

Foldable AnonymousElse Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousElse m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousElse a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousElse a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousElse a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousElse a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousElse a -> b #

foldr1 :: (a -> a -> a) -> AnonymousElse a -> a #

foldl1 :: (a -> a -> a) -> AnonymousElse a -> a #

toList :: AnonymousElse a -> [a] #

null :: AnonymousElse a -> Bool #

length :: AnonymousElse a -> Int #

elem :: Eq a => a -> AnonymousElse a -> Bool #

maximum :: Ord a => AnonymousElse a -> a #

minimum :: Ord a => AnonymousElse a -> a #

sum :: Num a => AnonymousElse a -> a #

product :: Num a => AnonymousElse a -> a #

Traversable AnonymousElse Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousElse a -> f (AnonymousElse b) #

sequenceA :: Applicative f => AnonymousElse (f a) -> f (AnonymousElse a) #

mapM :: Monad m => (a -> m b) -> AnonymousElse a -> m (AnonymousElse b) #

sequence :: Monad m => AnonymousElse (m a) -> m (AnonymousElse a) #

SymbolMatching AnonymousElse Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousElse 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 (AnonymousElse a)

Eq a => Eq (AnonymousElse a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousElse a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousElse a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousElse a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousElse a) :: Type -> Type #

Generic1 AnonymousElse Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousElse :: k -> Type #

type Rep (AnonymousElse a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousElse a) = D1 (MetaData "AnonymousElse" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousElse" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousElse Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousElse = D1 (MetaData "AnonymousElse" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousElse" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousDouble a Source #

Constructors

AnonymousDouble 

Fields

Instances
Functor AnonymousDouble Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousDouble a -> AnonymousDouble b #

(<$) :: a -> AnonymousDouble b -> AnonymousDouble a #

Foldable AnonymousDouble Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousDouble m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousDouble a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousDouble a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousDouble a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousDouble a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousDouble a -> b #

foldr1 :: (a -> a -> a) -> AnonymousDouble a -> a #

foldl1 :: (a -> a -> a) -> AnonymousDouble a -> a #

toList :: AnonymousDouble a -> [a] #

null :: AnonymousDouble a -> Bool #

length :: AnonymousDouble a -> Int #

elem :: Eq a => a -> AnonymousDouble a -> Bool #

maximum :: Ord a => AnonymousDouble a -> a #

minimum :: Ord a => AnonymousDouble a -> a #

sum :: Num a => AnonymousDouble a -> a #

product :: Num a => AnonymousDouble a -> a #

Traversable AnonymousDouble Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousDouble a -> f (AnonymousDouble b) #

sequenceA :: Applicative f => AnonymousDouble (f a) -> f (AnonymousDouble a) #

mapM :: Monad m => (a -> m b) -> AnonymousDouble a -> m (AnonymousDouble b) #

sequence :: Monad m => AnonymousDouble (m a) -> m (AnonymousDouble a) #

SymbolMatching AnonymousDouble Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousDouble 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 (AnonymousDouble a)

Eq a => Eq (AnonymousDouble a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousDouble a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousDouble a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousDouble a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousDouble a) :: Type -> Type #

Generic1 AnonymousDouble Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousDouble :: k -> Type #

type Rep (AnonymousDouble a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousDouble a) = D1 (MetaData "AnonymousDouble" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDouble" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousDouble Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousDouble = D1 (MetaData "AnonymousDouble" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDouble" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousDo a Source #

Constructors

AnonymousDo 

Fields

Instances
Functor AnonymousDo Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousDo a -> AnonymousDo b #

(<$) :: a -> AnonymousDo b -> AnonymousDo a #

Foldable AnonymousDo Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousDo m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousDo a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousDo a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousDo a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousDo a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousDo a -> b #

foldr1 :: (a -> a -> a) -> AnonymousDo a -> a #

foldl1 :: (a -> a -> a) -> AnonymousDo a -> a #

toList :: AnonymousDo a -> [a] #

null :: AnonymousDo a -> Bool #

length :: AnonymousDo a -> Int #

elem :: Eq a => a -> AnonymousDo a -> Bool #

maximum :: Ord a => AnonymousDo a -> a #

minimum :: Ord a => AnonymousDo a -> a #

sum :: Num a => AnonymousDo a -> a #

product :: Num a => AnonymousDo a -> a #

Traversable AnonymousDo Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousDo a -> f (AnonymousDo b) #

sequenceA :: Applicative f => AnonymousDo (f a) -> f (AnonymousDo a) #

mapM :: Monad m => (a -> m b) -> AnonymousDo a -> m (AnonymousDo b) #

sequence :: Monad m => AnonymousDo (m a) -> m (AnonymousDo a) #

SymbolMatching AnonymousDo Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousDo 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 (AnonymousDo a)

Eq a => Eq (AnonymousDo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousDo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousDo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousDo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousDo a) :: Type -> Type #

Methods

from :: AnonymousDo a -> Rep (AnonymousDo a) x #

to :: Rep (AnonymousDo a) x -> AnonymousDo a #

Generic1 AnonymousDo Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousDo :: k -> Type #

type Rep (AnonymousDo a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousDo a) = D1 (MetaData "AnonymousDo" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDo" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousDo Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousDo = D1 (MetaData "AnonymousDo" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDo" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousDefault a Source #

Constructors

AnonymousDefault 

Fields

Instances
Functor AnonymousDefault Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousDefault a -> AnonymousDefault b #

(<$) :: a -> AnonymousDefault b -> AnonymousDefault a #

Foldable AnonymousDefault Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousDefault m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousDefault a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousDefault a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousDefault a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousDefault a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousDefault a -> b #

foldr1 :: (a -> a -> a) -> AnonymousDefault a -> a #

foldl1 :: (a -> a -> a) -> AnonymousDefault a -> a #

toList :: AnonymousDefault a -> [a] #

null :: AnonymousDefault a -> Bool #

length :: AnonymousDefault a -> Int #

elem :: Eq a => a -> AnonymousDefault a -> Bool #

maximum :: Ord a => AnonymousDefault a -> a #

minimum :: Ord a => AnonymousDefault a -> a #

sum :: Num a => AnonymousDefault a -> a #

product :: Num a => AnonymousDefault a -> a #

Traversable AnonymousDefault Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousDefault a -> f (AnonymousDefault b) #

sequenceA :: Applicative f => AnonymousDefault (f a) -> f (AnonymousDefault a) #

mapM :: Monad m => (a -> m b) -> AnonymousDefault a -> m (AnonymousDefault b) #

sequence :: Monad m => AnonymousDefault (m a) -> m (AnonymousDefault a) #

SymbolMatching AnonymousDefault Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousDefault 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 (AnonymousDefault a)

Eq a => Eq (AnonymousDefault a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousDefault a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousDefault a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousDefault a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousDefault a) :: Type -> Type #

Generic1 AnonymousDefault Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousDefault :: k -> Type #

type Rep (AnonymousDefault a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousDefault a) = D1 (MetaData "AnonymousDefault" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDefault" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousDefault Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousDefault = D1 (MetaData "AnonymousDefault" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDefault" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "DecimalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "DecimalIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "DecimalFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "DecimalFloatingPointLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousContinue a Source #

Constructors

AnonymousContinue 

Fields

Instances
Functor AnonymousContinue Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousContinue Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousContinue m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousContinue a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousContinue a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousContinue a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousContinue a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousContinue a -> b #

foldr1 :: (a -> a -> a) -> AnonymousContinue a -> a #

foldl1 :: (a -> a -> a) -> AnonymousContinue a -> a #

toList :: AnonymousContinue a -> [a] #

null :: AnonymousContinue a -> Bool #

length :: AnonymousContinue a -> Int #

elem :: Eq a => a -> AnonymousContinue a -> Bool #

maximum :: Ord a => AnonymousContinue a -> a #

minimum :: Ord a => AnonymousContinue a -> a #

sum :: Num a => AnonymousContinue a -> a #

product :: Num a => AnonymousContinue a -> a #

Traversable AnonymousContinue Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousContinue a -> f (AnonymousContinue b) #

sequenceA :: Applicative f => AnonymousContinue (f a) -> f (AnonymousContinue a) #

mapM :: Monad m => (a -> m b) -> AnonymousContinue a -> m (AnonymousContinue b) #

sequence :: Monad m => AnonymousContinue (m a) -> m (AnonymousContinue a) #

SymbolMatching AnonymousContinue Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousContinue 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 (AnonymousContinue a)

Eq a => Eq (AnonymousContinue a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousContinue a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousContinue a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousContinue a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousContinue a) :: Type -> Type #

Generic1 AnonymousContinue Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousContinue :: k -> Type #

type Rep (AnonymousContinue a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousContinue a) = D1 (MetaData "AnonymousContinue" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousContinue" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousContinue Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousContinue = D1 (MetaData "AnonymousContinue" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousContinue" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousClass a Source #

Constructors

AnonymousClass 

Fields

Instances
Functor AnonymousClass Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousClass a -> AnonymousClass b #

(<$) :: a -> AnonymousClass b -> AnonymousClass a #

Foldable AnonymousClass Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousClass m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousClass a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousClass a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousClass a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousClass a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousClass a -> b #

foldr1 :: (a -> a -> a) -> AnonymousClass a -> a #

foldl1 :: (a -> a -> a) -> AnonymousClass a -> a #

toList :: AnonymousClass a -> [a] #

null :: AnonymousClass a -> Bool #

length :: AnonymousClass a -> Int #

elem :: Eq a => a -> AnonymousClass a -> Bool #

maximum :: Ord a => AnonymousClass a -> a #

minimum :: Ord a => AnonymousClass a -> a #

sum :: Num a => AnonymousClass a -> a #

product :: Num a => AnonymousClass a -> a #

Traversable AnonymousClass Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousClass a -> f (AnonymousClass b) #

sequenceA :: Applicative f => AnonymousClass (f a) -> f (AnonymousClass a) #

mapM :: Monad m => (a -> m b) -> AnonymousClass a -> m (AnonymousClass b) #

sequence :: Monad m => AnonymousClass (m a) -> m (AnonymousClass a) #

SymbolMatching AnonymousClass Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousClass 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 (AnonymousClass a)

Eq a => Eq (AnonymousClass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousClass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousClass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousClass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousClass a) :: Type -> Type #

Generic1 AnonymousClass Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousClass :: k -> Type #

type Rep (AnonymousClass a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousClass a) = D1 (MetaData "AnonymousClass" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousClass" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousClass Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousClass = D1 (MetaData "AnonymousClass" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousClass" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "CharacterLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "CharacterLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousChar a Source #

Constructors

AnonymousChar 

Fields

Instances
Functor AnonymousChar Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousChar a -> AnonymousChar b #

(<$) :: a -> AnonymousChar b -> AnonymousChar a #

Foldable AnonymousChar Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousChar m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousChar a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousChar a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousChar a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousChar a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousChar a -> b #

foldr1 :: (a -> a -> a) -> AnonymousChar a -> a #

foldl1 :: (a -> a -> a) -> AnonymousChar a -> a #

toList :: AnonymousChar a -> [a] #

null :: AnonymousChar a -> Bool #

length :: AnonymousChar a -> Int #

elem :: Eq a => a -> AnonymousChar a -> Bool #

maximum :: Ord a => AnonymousChar a -> a #

minimum :: Ord a => AnonymousChar a -> a #

sum :: Num a => AnonymousChar a -> a #

product :: Num a => AnonymousChar a -> a #

Traversable AnonymousChar Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousChar a -> f (AnonymousChar b) #

sequenceA :: Applicative f => AnonymousChar (f a) -> f (AnonymousChar a) #

mapM :: Monad m => (a -> m b) -> AnonymousChar a -> m (AnonymousChar b) #

sequence :: Monad m => AnonymousChar (m a) -> m (AnonymousChar a) #

SymbolMatching AnonymousChar Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousChar 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 (AnonymousChar a)

Eq a => Eq (AnonymousChar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousChar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousChar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousChar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousChar a) :: Type -> Type #

Generic1 AnonymousChar Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousChar :: k -> Type #

type Rep (AnonymousChar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousChar a) = D1 (MetaData "AnonymousChar" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousChar" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousChar Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousChar = D1 (MetaData "AnonymousChar" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousChar" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousCatch a Source #

Constructors

AnonymousCatch 

Fields

Instances
Functor AnonymousCatch Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousCatch a -> AnonymousCatch b #

(<$) :: a -> AnonymousCatch b -> AnonymousCatch a #

Foldable AnonymousCatch Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousCatch m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousCatch a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousCatch a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousCatch a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousCatch a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousCatch a -> b #

foldr1 :: (a -> a -> a) -> AnonymousCatch a -> a #

foldl1 :: (a -> a -> a) -> AnonymousCatch a -> a #

toList :: AnonymousCatch a -> [a] #

null :: AnonymousCatch a -> Bool #

length :: AnonymousCatch a -> Int #

elem :: Eq a => a -> AnonymousCatch a -> Bool #

maximum :: Ord a => AnonymousCatch a -> a #

minimum :: Ord a => AnonymousCatch a -> a #

sum :: Num a => AnonymousCatch a -> a #

product :: Num a => AnonymousCatch a -> a #

Traversable AnonymousCatch Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousCatch a -> f (AnonymousCatch b) #

sequenceA :: Applicative f => AnonymousCatch (f a) -> f (AnonymousCatch a) #

mapM :: Monad m => (a -> m b) -> AnonymousCatch a -> m (AnonymousCatch b) #

sequence :: Monad m => AnonymousCatch (m a) -> m (AnonymousCatch a) #

SymbolMatching AnonymousCatch Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousCatch 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 (AnonymousCatch a)

Eq a => Eq (AnonymousCatch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousCatch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousCatch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousCatch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousCatch a) :: Type -> Type #

Generic1 AnonymousCatch Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousCatch :: k -> Type #

type Rep (AnonymousCatch a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousCatch a) = D1 (MetaData "AnonymousCatch" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCatch" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousCatch Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousCatch = D1 (MetaData "AnonymousCatch" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCatch" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousCase a Source #

Constructors

AnonymousCase 

Fields

Instances
Functor AnonymousCase Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousCase a -> AnonymousCase b #

(<$) :: a -> AnonymousCase b -> AnonymousCase a #

Foldable AnonymousCase Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousCase m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousCase a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousCase a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousCase a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousCase a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousCase a -> b #

foldr1 :: (a -> a -> a) -> AnonymousCase a -> a #

foldl1 :: (a -> a -> a) -> AnonymousCase a -> a #

toList :: AnonymousCase a -> [a] #

null :: AnonymousCase a -> Bool #

length :: AnonymousCase a -> Int #

elem :: Eq a => a -> AnonymousCase a -> Bool #

maximum :: Ord a => AnonymousCase a -> a #

minimum :: Ord a => AnonymousCase a -> a #

sum :: Num a => AnonymousCase a -> a #

product :: Num a => AnonymousCase a -> a #

Traversable AnonymousCase Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousCase a -> f (AnonymousCase b) #

sequenceA :: Applicative f => AnonymousCase (f a) -> f (AnonymousCase a) #

mapM :: Monad m => (a -> m b) -> AnonymousCase a -> m (AnonymousCase b) #

sequence :: Monad m => AnonymousCase (m a) -> m (AnonymousCase a) #

SymbolMatching AnonymousCase Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousCase 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 (AnonymousCase a)

Eq a => Eq (AnonymousCase a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousCase a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousCase a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousCase a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousCase a) :: Type -> Type #

Generic1 AnonymousCase Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousCase :: k -> Type #

type Rep (AnonymousCase a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousCase a) = D1 (MetaData "AnonymousCase" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCase" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousCase Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousCase = D1 (MetaData "AnonymousCase" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCase" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousByte a Source #

Constructors

AnonymousByte 

Fields

Instances
Functor AnonymousByte Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousByte a -> AnonymousByte b #

(<$) :: a -> AnonymousByte b -> AnonymousByte a #

Foldable AnonymousByte Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousByte m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousByte a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousByte a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousByte a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousByte a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousByte a -> b #

foldr1 :: (a -> a -> a) -> AnonymousByte a -> a #

foldl1 :: (a -> a -> a) -> AnonymousByte a -> a #

toList :: AnonymousByte a -> [a] #

null :: AnonymousByte a -> Bool #

length :: AnonymousByte a -> Int #

elem :: Eq a => a -> AnonymousByte a -> Bool #

maximum :: Ord a => AnonymousByte a -> a #

minimum :: Ord a => AnonymousByte a -> a #

sum :: Num a => AnonymousByte a -> a #

product :: Num a => AnonymousByte a -> a #

Traversable AnonymousByte Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousByte a -> f (AnonymousByte b) #

sequenceA :: Applicative f => AnonymousByte (f a) -> f (AnonymousByte a) #

mapM :: Monad m => (a -> m b) -> AnonymousByte a -> m (AnonymousByte b) #

sequence :: Monad m => AnonymousByte (m a) -> m (AnonymousByte a) #

SymbolMatching AnonymousByte Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousByte 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 (AnonymousByte a)

Eq a => Eq (AnonymousByte a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousByte a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousByte a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousByte a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousByte a) :: Type -> Type #

Generic1 AnonymousByte Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousByte :: k -> Type #

type Rep (AnonymousByte a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousByte a) = D1 (MetaData "AnonymousByte" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousByte" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousByte Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousByte = D1 (MetaData "AnonymousByte" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousByte" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousBreak a Source #

Constructors

AnonymousBreak 

Fields

Instances
Functor AnonymousBreak Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousBreak a -> AnonymousBreak b #

(<$) :: a -> AnonymousBreak b -> AnonymousBreak a #

Foldable AnonymousBreak Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousBreak m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousBreak a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousBreak a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousBreak a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousBreak a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousBreak a -> b #

foldr1 :: (a -> a -> a) -> AnonymousBreak a -> a #

foldl1 :: (a -> a -> a) -> AnonymousBreak a -> a #

toList :: AnonymousBreak a -> [a] #

null :: AnonymousBreak a -> Bool #

length :: AnonymousBreak a -> Int #

elem :: Eq a => a -> AnonymousBreak a -> Bool #

maximum :: Ord a => AnonymousBreak a -> a #

minimum :: Ord a => AnonymousBreak a -> a #

sum :: Num a => AnonymousBreak a -> a #

product :: Num a => AnonymousBreak a -> a #

Traversable AnonymousBreak Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousBreak a -> f (AnonymousBreak b) #

sequenceA :: Applicative f => AnonymousBreak (f a) -> f (AnonymousBreak a) #

mapM :: Monad m => (a -> m b) -> AnonymousBreak a -> m (AnonymousBreak b) #

sequence :: Monad m => AnonymousBreak (m a) -> m (AnonymousBreak a) #

SymbolMatching AnonymousBreak Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousBreak 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 (AnonymousBreak a)

Eq a => Eq (AnonymousBreak a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousBreak a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousBreak a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousBreak a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousBreak a) :: Type -> Type #

Generic1 AnonymousBreak Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousBreak :: k -> Type #

type Rep (AnonymousBreak a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousBreak a) = D1 (MetaData "AnonymousBreak" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousBreak" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousBreak Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousBreak = D1 (MetaData "AnonymousBreak" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousBreak" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.0.0-inplace" False) (C1 (MetaCons "BooleanType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "BooleanType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "BinaryIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "BinaryIntegerLiteral" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))

newtype AnonymousAssert a Source #

Constructors

AnonymousAssert 

Fields

Instances
Functor AnonymousAssert Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousAssert a -> AnonymousAssert b #

(<$) :: a -> AnonymousAssert b -> AnonymousAssert a #

Foldable AnonymousAssert Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousAssert m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousAssert a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousAssert a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousAssert a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousAssert a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousAssert a -> b #

foldr1 :: (a -> a -> a) -> AnonymousAssert a -> a #

foldl1 :: (a -> a -> a) -> AnonymousAssert a -> a #

toList :: AnonymousAssert a -> [a] #

null :: AnonymousAssert a -> Bool #

length :: AnonymousAssert a -> Int #

elem :: Eq a => a -> AnonymousAssert a -> Bool #

maximum :: Ord a => AnonymousAssert a -> a #

minimum :: Ord a => AnonymousAssert a -> a #

sum :: Num a => AnonymousAssert a -> a #

product :: Num a => AnonymousAssert a -> a #

Traversable AnonymousAssert Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousAssert a -> f (AnonymousAssert b) #

sequenceA :: Applicative f => AnonymousAssert (f a) -> f (AnonymousAssert a) #

mapM :: Monad m => (a -> m b) -> AnonymousAssert a -> m (AnonymousAssert b) #

sequence :: Monad m => AnonymousAssert (m a) -> m (AnonymousAssert a) #

SymbolMatching AnonymousAssert Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAssert 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 (AnonymousAssert a)

Eq a => Eq (AnonymousAssert a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAssert a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAssert a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAssert a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAssert a) :: Type -> Type #

Generic1 AnonymousAssert Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAssert :: k -> Type #

type Rep (AnonymousAssert a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAssert a) = D1 (MetaData "AnonymousAssert" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAssert" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAssert Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAssert = D1 (MetaData "AnonymousAssert" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAssert" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousAbstract a Source #

Constructors

AnonymousAbstract 

Fields

Instances
Functor AnonymousAbstract Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousAbstract Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousAbstract m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousAbstract a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousAbstract a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousAbstract a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousAbstract a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousAbstract a -> b #

foldr1 :: (a -> a -> a) -> AnonymousAbstract a -> a #

foldl1 :: (a -> a -> a) -> AnonymousAbstract a -> a #

toList :: AnonymousAbstract a -> [a] #

null :: AnonymousAbstract a -> Bool #

length :: AnonymousAbstract a -> Int #

elem :: Eq a => a -> AnonymousAbstract a -> Bool #

maximum :: Ord a => AnonymousAbstract a -> a #

minimum :: Ord a => AnonymousAbstract a -> a #

sum :: Num a => AnonymousAbstract a -> a #

product :: Num a => AnonymousAbstract a -> a #

Traversable AnonymousAbstract Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousAbstract a -> f (AnonymousAbstract b) #

sequenceA :: Applicative f => AnonymousAbstract (f a) -> f (AnonymousAbstract a) #

mapM :: Monad m => (a -> m b) -> AnonymousAbstract a -> m (AnonymousAbstract b) #

sequence :: Monad m => AnonymousAbstract (m a) -> m (AnonymousAbstract a) #

SymbolMatching AnonymousAbstract Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAbstract 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 (AnonymousAbstract a)

Eq a => Eq (AnonymousAbstract a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAbstract a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAbstract a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAbstract a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAbstract a) :: Type -> Type #

Generic1 AnonymousAbstract Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAbstract :: k -> Type #

type Rep (AnonymousAbstract a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAbstract a) = D1 (MetaData "AnonymousAbstract" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAbstract" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAbstract Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAbstract = D1 (MetaData "AnonymousAbstract" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAbstract" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousCaretEqual a Source #

Constructors

AnonymousCaretEqual 

Fields

Instances
Functor AnonymousCaretEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousCaretEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousCaretEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousCaretEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousCaretEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousCaretEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousCaretEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousCaretEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousCaretEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousCaretEqual a -> a #

toList :: AnonymousCaretEqual a -> [a] #

null :: AnonymousCaretEqual a -> Bool #

length :: AnonymousCaretEqual a -> Int #

elem :: Eq a => a -> AnonymousCaretEqual a -> Bool #

maximum :: Ord a => AnonymousCaretEqual a -> a #

minimum :: Ord a => AnonymousCaretEqual a -> a #

sum :: Num a => AnonymousCaretEqual a -> a #

product :: Num a => AnonymousCaretEqual a -> a #

Traversable AnonymousCaretEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousCaretEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousCaretEqual 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 (AnonymousCaretEqual a)

Eq a => Eq (AnonymousCaretEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousCaretEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousCaretEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousCaretEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousCaretEqual a) :: Type -> Type #

Generic1 AnonymousCaretEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousCaretEqual :: k -> Type #

type Rep (AnonymousCaretEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousCaretEqual a) = D1 (MetaData "AnonymousCaretEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCaretEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousCaretEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousCaretEqual = D1 (MetaData "AnonymousCaretEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCaretEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousCaret a Source #

Constructors

AnonymousCaret 

Fields

Instances
Functor AnonymousCaret Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousCaret a -> AnonymousCaret b #

(<$) :: a -> AnonymousCaret b -> AnonymousCaret a #

Foldable AnonymousCaret Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousCaret m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousCaret a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousCaret a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousCaret a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousCaret a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousCaret a -> b #

foldr1 :: (a -> a -> a) -> AnonymousCaret a -> a #

foldl1 :: (a -> a -> a) -> AnonymousCaret a -> a #

toList :: AnonymousCaret a -> [a] #

null :: AnonymousCaret a -> Bool #

length :: AnonymousCaret a -> Int #

elem :: Eq a => a -> AnonymousCaret a -> Bool #

maximum :: Ord a => AnonymousCaret a -> a #

minimum :: Ord a => AnonymousCaret a -> a #

sum :: Num a => AnonymousCaret a -> a #

product :: Num a => AnonymousCaret a -> a #

Traversable AnonymousCaret Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousCaret a -> f (AnonymousCaret b) #

sequenceA :: Applicative f => AnonymousCaret (f a) -> f (AnonymousCaret a) #

mapM :: Monad m => (a -> m b) -> AnonymousCaret a -> m (AnonymousCaret b) #

sequence :: Monad m => AnonymousCaret (m a) -> m (AnonymousCaret a) #

SymbolMatching AnonymousCaret Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousCaret 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 (AnonymousCaret a)

Eq a => Eq (AnonymousCaret a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousCaret a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousCaret a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousCaret a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousCaret a) :: Type -> Type #

Generic1 AnonymousCaret Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousCaret :: k -> Type #

type Rep (AnonymousCaret a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousCaret a) = D1 (MetaData "AnonymousCaret" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCaret" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousCaret Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousCaret = D1 (MetaData "AnonymousCaret" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousCaret" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRBracket a Source #

Constructors

AnonymousRBracket 

Fields

Instances
Functor AnonymousRBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousRBracket m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousRBracket a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousRBracket a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousRBracket a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousRBracket a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousRBracket a -> b #

foldr1 :: (a -> a -> a) -> AnonymousRBracket a -> a #

foldl1 :: (a -> a -> a) -> AnonymousRBracket a -> a #

toList :: AnonymousRBracket a -> [a] #

null :: AnonymousRBracket a -> Bool #

length :: AnonymousRBracket a -> Int #

elem :: Eq a => a -> AnonymousRBracket a -> Bool #

maximum :: Ord a => AnonymousRBracket a -> a #

minimum :: Ord a => AnonymousRBracket a -> a #

sum :: Num a => AnonymousRBracket a -> a #

product :: Num a => AnonymousRBracket a -> a #

Traversable AnonymousRBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousRBracket a -> f (AnonymousRBracket b) #

sequenceA :: Applicative f => AnonymousRBracket (f a) -> f (AnonymousRBracket a) #

mapM :: Monad m => (a -> m b) -> AnonymousRBracket a -> m (AnonymousRBracket b) #

sequence :: Monad m => AnonymousRBracket (m a) -> m (AnonymousRBracket a) #

SymbolMatching AnonymousRBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRBracket 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 (AnonymousRBracket a)

Eq a => Eq (AnonymousRBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRBracket a) :: Type -> Type #

Generic1 AnonymousRBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRBracket :: k -> Type #

type Rep (AnonymousRBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRBracket a) = D1 (MetaData "AnonymousRBracket" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRBracket" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRBracket = D1 (MetaData "AnonymousRBracket" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRBracket" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLBracket a Source #

Constructors

AnonymousLBracket 

Fields

Instances
Functor AnonymousLBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousLBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousLBracket m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousLBracket a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousLBracket a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousLBracket a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousLBracket a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousLBracket a -> b #

foldr1 :: (a -> a -> a) -> AnonymousLBracket a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLBracket a -> a #

toList :: AnonymousLBracket a -> [a] #

null :: AnonymousLBracket a -> Bool #

length :: AnonymousLBracket a -> Int #

elem :: Eq a => a -> AnonymousLBracket a -> Bool #

maximum :: Ord a => AnonymousLBracket a -> a #

minimum :: Ord a => AnonymousLBracket a -> a #

sum :: Num a => AnonymousLBracket a -> a #

product :: Num a => AnonymousLBracket a -> a #

Traversable AnonymousLBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousLBracket a -> f (AnonymousLBracket b) #

sequenceA :: Applicative f => AnonymousLBracket (f a) -> f (AnonymousLBracket a) #

mapM :: Monad m => (a -> m b) -> AnonymousLBracket a -> m (AnonymousLBracket b) #

sequence :: Monad m => AnonymousLBracket (m a) -> m (AnonymousLBracket a) #

SymbolMatching AnonymousLBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLBracket 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 (AnonymousLBracket a)

Eq a => Eq (AnonymousLBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLBracket a) :: Type -> Type #

Generic1 AnonymousLBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLBracket :: k -> Type #

type Rep (AnonymousLBracket a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLBracket a) = D1 (MetaData "AnonymousLBracket" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLBracket" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLBracket Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLBracket = D1 (MetaData "AnonymousLBracket" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLBracket" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousAtinterface a Source #

Constructors

AnonymousAtinterface 

Fields

Instances
Functor AnonymousAtinterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousAtinterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousAtinterface m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousAtinterface a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousAtinterface a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousAtinterface a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousAtinterface a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousAtinterface a -> b #

foldr1 :: (a -> a -> a) -> AnonymousAtinterface a -> a #

foldl1 :: (a -> a -> a) -> AnonymousAtinterface a -> a #

toList :: AnonymousAtinterface a -> [a] #

null :: AnonymousAtinterface a -> Bool #

length :: AnonymousAtinterface a -> Int #

elem :: Eq a => a -> AnonymousAtinterface a -> Bool #

maximum :: Ord a => AnonymousAtinterface a -> a #

minimum :: Ord a => AnonymousAtinterface a -> a #

sum :: Num a => AnonymousAtinterface a -> a #

product :: Num a => AnonymousAtinterface a -> a #

Traversable AnonymousAtinterface Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousAtinterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAtinterface 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 (AnonymousAtinterface a)

Eq a => Eq (AnonymousAtinterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAtinterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAtinterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAtinterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAtinterface a) :: Type -> Type #

Generic1 AnonymousAtinterface Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAtinterface :: k -> Type #

type Rep (AnonymousAtinterface a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAtinterface a) = D1 (MetaData "AnonymousAtinterface" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAtinterface" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAtinterface Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAtinterface = D1 (MetaData "AnonymousAtinterface" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAtinterface" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousAt a Source #

Constructors

AnonymousAt 

Fields

Instances
Functor AnonymousAt Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousAt a -> AnonymousAt b #

(<$) :: a -> AnonymousAt b -> AnonymousAt a #

Foldable AnonymousAt Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousAt m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousAt a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousAt a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousAt a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousAt a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousAt a -> b #

foldr1 :: (a -> a -> a) -> AnonymousAt a -> a #

foldl1 :: (a -> a -> a) -> AnonymousAt a -> a #

toList :: AnonymousAt a -> [a] #

null :: AnonymousAt a -> Bool #

length :: AnonymousAt a -> Int #

elem :: Eq a => a -> AnonymousAt a -> Bool #

maximum :: Ord a => AnonymousAt a -> a #

minimum :: Ord a => AnonymousAt a -> a #

sum :: Num a => AnonymousAt a -> a #

product :: Num a => AnonymousAt a -> a #

Traversable AnonymousAt Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousAt a -> f (AnonymousAt b) #

sequenceA :: Applicative f => AnonymousAt (f a) -> f (AnonymousAt a) #

mapM :: Monad m => (a -> m b) -> AnonymousAt a -> m (AnonymousAt b) #

sequence :: Monad m => AnonymousAt (m a) -> m (AnonymousAt a) #

SymbolMatching AnonymousAt Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAt 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 (AnonymousAt a)

Eq a => Eq (AnonymousAt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAt a) :: Type -> Type #

Methods

from :: AnonymousAt a -> Rep (AnonymousAt a) x #

to :: Rep (AnonymousAt a) x -> AnonymousAt a #

Generic1 AnonymousAt Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAt :: k -> Type #

type Rep (AnonymousAt a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAt a) = D1 (MetaData "AnonymousAt" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAt" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAt Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAt = D1 (MetaData "AnonymousAt" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAt" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousQuestion a Source #

Constructors

AnonymousQuestion 

Fields

Instances
Functor AnonymousQuestion Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousQuestion Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousQuestion m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousQuestion a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousQuestion a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousQuestion a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousQuestion a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousQuestion a -> b #

foldr1 :: (a -> a -> a) -> AnonymousQuestion a -> a #

foldl1 :: (a -> a -> a) -> AnonymousQuestion a -> a #

toList :: AnonymousQuestion a -> [a] #

null :: AnonymousQuestion a -> Bool #

length :: AnonymousQuestion a -> Int #

elem :: Eq a => a -> AnonymousQuestion a -> Bool #

maximum :: Ord a => AnonymousQuestion a -> a #

minimum :: Ord a => AnonymousQuestion a -> a #

sum :: Num a => AnonymousQuestion a -> a #

product :: Num a => AnonymousQuestion a -> a #

Traversable AnonymousQuestion Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousQuestion a -> f (AnonymousQuestion b) #

sequenceA :: Applicative f => AnonymousQuestion (f a) -> f (AnonymousQuestion a) #

mapM :: Monad m => (a -> m b) -> AnonymousQuestion a -> m (AnonymousQuestion b) #

sequence :: Monad m => AnonymousQuestion (m a) -> m (AnonymousQuestion a) #

SymbolMatching AnonymousQuestion Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousQuestion 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 (AnonymousQuestion a)

Eq a => Eq (AnonymousQuestion a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousQuestion a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousQuestion a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousQuestion a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousQuestion a) :: Type -> Type #

Generic1 AnonymousQuestion Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousQuestion :: k -> Type #

type Rep (AnonymousQuestion a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousQuestion a) = D1 (MetaData "AnonymousQuestion" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousQuestion" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousQuestion Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousQuestion = D1 (MetaData "AnonymousQuestion" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousQuestion" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRAngleRAngleRAngleEqual a Source #

Constructors

AnonymousRAngleRAngleRAngleEqual 

Fields

Instances
Functor AnonymousRAngleRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRAngleRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable AnonymousRAngleRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousRAngleRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRAngleRAngleRAngleEqual 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 (AnonymousRAngleRAngleRAngleEqual a)

Eq a => Eq (AnonymousRAngleRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRAngleRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRAngleRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRAngleRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRAngleRAngleRAngleEqual a) :: Type -> Type #

Generic1 AnonymousRAngleRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRAngleRAngleRAngleEqual :: k -> Type #

type Rep (AnonymousRAngleRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRAngleRAngleRAngleEqual a) = D1 (MetaData "AnonymousRAngleRAngleRAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngleRAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRAngleRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRAngleRAngleRAngleEqual = D1 (MetaData "AnonymousRAngleRAngleRAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngleRAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRAngleRAngleRAngle a Source #

Constructors

AnonymousRAngleRAngleRAngle 

Fields

Instances
Functor AnonymousRAngleRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRAngleRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable AnonymousRAngleRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousRAngleRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRAngleRAngleRAngle 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 (AnonymousRAngleRAngleRAngle a)

Eq a => Eq (AnonymousRAngleRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRAngleRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRAngleRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRAngleRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRAngleRAngleRAngle a) :: Type -> Type #

Generic1 AnonymousRAngleRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRAngleRAngleRAngle :: k -> Type #

type Rep (AnonymousRAngleRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRAngleRAngleRAngle a) = D1 (MetaData "AnonymousRAngleRAngleRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngleRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRAngleRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRAngleRAngleRAngle = D1 (MetaData "AnonymousRAngleRAngleRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngleRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRAngleRAngleEqual a Source #

Constructors

AnonymousRAngleRAngleEqual 

Fields

Instances
Functor AnonymousRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousRAngleRAngleEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousRAngleRAngleEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousRAngleRAngleEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousRAngleRAngleEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousRAngleRAngleEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousRAngleRAngleEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousRAngleRAngleEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousRAngleRAngleEqual a -> a #

toList :: AnonymousRAngleRAngleEqual a -> [a] #

null :: AnonymousRAngleRAngleEqual a -> Bool #

length :: AnonymousRAngleRAngleEqual a -> Int #

elem :: Eq a => a -> AnonymousRAngleRAngleEqual a -> Bool #

maximum :: Ord a => AnonymousRAngleRAngleEqual a -> a #

minimum :: Ord a => AnonymousRAngleRAngleEqual a -> a #

sum :: Num a => AnonymousRAngleRAngleEqual a -> a #

product :: Num a => AnonymousRAngleRAngleEqual a -> a #

Traversable AnonymousRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRAngleRAngleEqual 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 (AnonymousRAngleRAngleEqual a)

Eq a => Eq (AnonymousRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRAngleRAngleEqual a) :: Type -> Type #

Generic1 AnonymousRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRAngleRAngleEqual :: k -> Type #

type Rep (AnonymousRAngleRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRAngleRAngleEqual a) = D1 (MetaData "AnonymousRAngleRAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRAngleRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRAngleRAngleEqual = D1 (MetaData "AnonymousRAngleRAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRAngleRAngle a Source #

Constructors

AnonymousRAngleRAngle 

Fields

Instances
Functor AnonymousRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousRAngleRAngle m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousRAngleRAngle a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousRAngleRAngle a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousRAngleRAngle a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousRAngleRAngle a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousRAngleRAngle a -> b #

foldr1 :: (a -> a -> a) -> AnonymousRAngleRAngle a -> a #

foldl1 :: (a -> a -> a) -> AnonymousRAngleRAngle a -> a #

toList :: AnonymousRAngleRAngle a -> [a] #

null :: AnonymousRAngleRAngle a -> Bool #

length :: AnonymousRAngleRAngle a -> Int #

elem :: Eq a => a -> AnonymousRAngleRAngle a -> Bool #

maximum :: Ord a => AnonymousRAngleRAngle a -> a #

minimum :: Ord a => AnonymousRAngleRAngle a -> a #

sum :: Num a => AnonymousRAngleRAngle a -> a #

product :: Num a => AnonymousRAngleRAngle a -> a #

Traversable AnonymousRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRAngleRAngle 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 (AnonymousRAngleRAngle a)

Eq a => Eq (AnonymousRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRAngleRAngle a) :: Type -> Type #

Generic1 AnonymousRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRAngleRAngle :: k -> Type #

type Rep (AnonymousRAngleRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRAngleRAngle a) = D1 (MetaData "AnonymousRAngleRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRAngleRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRAngleRAngle = D1 (MetaData "AnonymousRAngleRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRAngleEqual a Source #

Constructors

AnonymousRAngleEqual 

Fields

Instances
Functor AnonymousRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousRAngleEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousRAngleEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousRAngleEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousRAngleEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousRAngleEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousRAngleEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousRAngleEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousRAngleEqual a -> a #

toList :: AnonymousRAngleEqual a -> [a] #

null :: AnonymousRAngleEqual a -> Bool #

length :: AnonymousRAngleEqual a -> Int #

elem :: Eq a => a -> AnonymousRAngleEqual a -> Bool #

maximum :: Ord a => AnonymousRAngleEqual a -> a #

minimum :: Ord a => AnonymousRAngleEqual a -> a #

sum :: Num a => AnonymousRAngleEqual a -> a #

product :: Num a => AnonymousRAngleEqual a -> a #

Traversable AnonymousRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRAngleEqual 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 (AnonymousRAngleEqual a)

Eq a => Eq (AnonymousRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRAngleEqual a) :: Type -> Type #

Generic1 AnonymousRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRAngleEqual :: k -> Type #

type Rep (AnonymousRAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRAngleEqual a) = D1 (MetaData "AnonymousRAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRAngleEqual = D1 (MetaData "AnonymousRAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRAngle a Source #

Constructors

AnonymousRAngle 

Fields

Instances
Functor AnonymousRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousRAngle a -> AnonymousRAngle b #

(<$) :: a -> AnonymousRAngle b -> AnonymousRAngle a #

Foldable AnonymousRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousRAngle m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousRAngle a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousRAngle a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousRAngle a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousRAngle a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousRAngle a -> b #

foldr1 :: (a -> a -> a) -> AnonymousRAngle a -> a #

foldl1 :: (a -> a -> a) -> AnonymousRAngle a -> a #

toList :: AnonymousRAngle a -> [a] #

null :: AnonymousRAngle a -> Bool #

length :: AnonymousRAngle a -> Int #

elem :: Eq a => a -> AnonymousRAngle a -> Bool #

maximum :: Ord a => AnonymousRAngle a -> a #

minimum :: Ord a => AnonymousRAngle a -> a #

sum :: Num a => AnonymousRAngle a -> a #

product :: Num a => AnonymousRAngle a -> a #

Traversable AnonymousRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousRAngle a -> f (AnonymousRAngle b) #

sequenceA :: Applicative f => AnonymousRAngle (f a) -> f (AnonymousRAngle a) #

mapM :: Monad m => (a -> m b) -> AnonymousRAngle a -> m (AnonymousRAngle b) #

sequence :: Monad m => AnonymousRAngle (m a) -> m (AnonymousRAngle a) #

SymbolMatching AnonymousRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRAngle 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 (AnonymousRAngle a)

Eq a => Eq (AnonymousRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRAngle a) :: Type -> Type #

Generic1 AnonymousRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRAngle :: k -> Type #

type Rep (AnonymousRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRAngle a) = D1 (MetaData "AnonymousRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRAngle = D1 (MetaData "AnonymousRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousEqualEqual a Source #

Constructors

AnonymousEqualEqual 

Fields

Instances
Functor AnonymousEqualEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousEqualEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousEqualEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousEqualEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousEqualEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousEqualEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousEqualEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousEqualEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousEqualEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousEqualEqual a -> a #

toList :: AnonymousEqualEqual a -> [a] #

null :: AnonymousEqualEqual a -> Bool #

length :: AnonymousEqualEqual a -> Int #

elem :: Eq a => a -> AnonymousEqualEqual a -> Bool #

maximum :: Ord a => AnonymousEqualEqual a -> a #

minimum :: Ord a => AnonymousEqualEqual a -> a #

sum :: Num a => AnonymousEqualEqual a -> a #

product :: Num a => AnonymousEqualEqual a -> a #

Traversable AnonymousEqualEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousEqualEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousEqualEqual 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 (AnonymousEqualEqual a)

Eq a => Eq (AnonymousEqualEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousEqualEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousEqualEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousEqualEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousEqualEqual a) :: Type -> Type #

Generic1 AnonymousEqualEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousEqualEqual :: k -> Type #

type Rep (AnonymousEqualEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousEqualEqual a) = D1 (MetaData "AnonymousEqualEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousEqualEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousEqualEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousEqualEqual = D1 (MetaData "AnonymousEqualEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousEqualEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousEqual a Source #

Constructors

AnonymousEqual 

Fields

Instances
Functor AnonymousEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousEqual a -> AnonymousEqual b #

(<$) :: a -> AnonymousEqual b -> AnonymousEqual a #

Foldable AnonymousEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousEqual a -> a #

toList :: AnonymousEqual a -> [a] #

null :: AnonymousEqual a -> Bool #

length :: AnonymousEqual a -> Int #

elem :: Eq a => a -> AnonymousEqual a -> Bool #

maximum :: Ord a => AnonymousEqual a -> a #

minimum :: Ord a => AnonymousEqual a -> a #

sum :: Num a => AnonymousEqual a -> a #

product :: Num a => AnonymousEqual a -> a #

Traversable AnonymousEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousEqual a -> f (AnonymousEqual b) #

sequenceA :: Applicative f => AnonymousEqual (f a) -> f (AnonymousEqual a) #

mapM :: Monad m => (a -> m b) -> AnonymousEqual a -> m (AnonymousEqual b) #

sequence :: Monad m => AnonymousEqual (m a) -> m (AnonymousEqual a) #

SymbolMatching AnonymousEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousEqual 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 (AnonymousEqual a)

Eq a => Eq (AnonymousEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousEqual a) :: Type -> Type #

Generic1 AnonymousEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousEqual :: k -> Type #

type Rep (AnonymousEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousEqual a) = D1 (MetaData "AnonymousEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousEqual = D1 (MetaData "AnonymousEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLAngleEqual a Source #

Constructors

AnonymousLAngleEqual 

Fields

Instances
Functor AnonymousLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousLAngleEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousLAngleEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousLAngleEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousLAngleEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousLAngleEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousLAngleEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousLAngleEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLAngleEqual a -> a #

toList :: AnonymousLAngleEqual a -> [a] #

null :: AnonymousLAngleEqual a -> Bool #

length :: AnonymousLAngleEqual a -> Int #

elem :: Eq a => a -> AnonymousLAngleEqual a -> Bool #

maximum :: Ord a => AnonymousLAngleEqual a -> a #

minimum :: Ord a => AnonymousLAngleEqual a -> a #

sum :: Num a => AnonymousLAngleEqual a -> a #

product :: Num a => AnonymousLAngleEqual a -> a #

Traversable AnonymousLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLAngleEqual 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 (AnonymousLAngleEqual a)

Eq a => Eq (AnonymousLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLAngleEqual a) :: Type -> Type #

Generic1 AnonymousLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLAngleEqual :: k -> Type #

type Rep (AnonymousLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLAngleEqual a) = D1 (MetaData "AnonymousLAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLAngleEqual = D1 (MetaData "AnonymousLAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLAngleLAngleEqual a Source #

Constructors

AnonymousLAngleLAngleEqual 

Fields

Instances
Functor AnonymousLAngleLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousLAngleLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousLAngleLAngleEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousLAngleLAngleEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousLAngleLAngleEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousLAngleLAngleEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousLAngleLAngleEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousLAngleLAngleEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousLAngleLAngleEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLAngleLAngleEqual a -> a #

toList :: AnonymousLAngleLAngleEqual a -> [a] #

null :: AnonymousLAngleLAngleEqual a -> Bool #

length :: AnonymousLAngleLAngleEqual a -> Int #

elem :: Eq a => a -> AnonymousLAngleLAngleEqual a -> Bool #

maximum :: Ord a => AnonymousLAngleLAngleEqual a -> a #

minimum :: Ord a => AnonymousLAngleLAngleEqual a -> a #

sum :: Num a => AnonymousLAngleLAngleEqual a -> a #

product :: Num a => AnonymousLAngleLAngleEqual a -> a #

Traversable AnonymousLAngleLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousLAngleLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLAngleLAngleEqual 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 (AnonymousLAngleLAngleEqual a)

Eq a => Eq (AnonymousLAngleLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLAngleLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLAngleLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLAngleLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLAngleLAngleEqual a) :: Type -> Type #

Generic1 AnonymousLAngleLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLAngleLAngleEqual :: k -> Type #

type Rep (AnonymousLAngleLAngleEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLAngleLAngleEqual a) = D1 (MetaData "AnonymousLAngleLAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngleLAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLAngleLAngleEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLAngleLAngleEqual = D1 (MetaData "AnonymousLAngleLAngleEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngleLAngleEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLAngleLAngle a Source #

Constructors

AnonymousLAngleLAngle 

Fields

Instances
Functor AnonymousLAngleLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousLAngleLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousLAngleLAngle m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousLAngleLAngle a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousLAngleLAngle a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousLAngleLAngle a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousLAngleLAngle a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousLAngleLAngle a -> b #

foldr1 :: (a -> a -> a) -> AnonymousLAngleLAngle a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLAngleLAngle a -> a #

toList :: AnonymousLAngleLAngle a -> [a] #

null :: AnonymousLAngleLAngle a -> Bool #

length :: AnonymousLAngleLAngle a -> Int #

elem :: Eq a => a -> AnonymousLAngleLAngle a -> Bool #

maximum :: Ord a => AnonymousLAngleLAngle a -> a #

minimum :: Ord a => AnonymousLAngleLAngle a -> a #

sum :: Num a => AnonymousLAngleLAngle a -> a #

product :: Num a => AnonymousLAngleLAngle a -> a #

Traversable AnonymousLAngleLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousLAngleLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLAngleLAngle 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 (AnonymousLAngleLAngle a)

Eq a => Eq (AnonymousLAngleLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLAngleLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLAngleLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLAngleLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLAngleLAngle a) :: Type -> Type #

Generic1 AnonymousLAngleLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLAngleLAngle :: k -> Type #

type Rep (AnonymousLAngleLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLAngleLAngle a) = D1 (MetaData "AnonymousLAngleLAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngleLAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLAngleLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLAngleLAngle = D1 (MetaData "AnonymousLAngleLAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngleLAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLAngle a Source #

Constructors

AnonymousLAngle 

Fields

Instances
Functor AnonymousLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousLAngle a -> AnonymousLAngle b #

(<$) :: a -> AnonymousLAngle b -> AnonymousLAngle a #

Foldable AnonymousLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousLAngle m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousLAngle a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousLAngle a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousLAngle a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousLAngle a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousLAngle a -> b #

foldr1 :: (a -> a -> a) -> AnonymousLAngle a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLAngle a -> a #

toList :: AnonymousLAngle a -> [a] #

null :: AnonymousLAngle a -> Bool #

length :: AnonymousLAngle a -> Int #

elem :: Eq a => a -> AnonymousLAngle a -> Bool #

maximum :: Ord a => AnonymousLAngle a -> a #

minimum :: Ord a => AnonymousLAngle a -> a #

sum :: Num a => AnonymousLAngle a -> a #

product :: Num a => AnonymousLAngle a -> a #

Traversable AnonymousLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousLAngle a -> f (AnonymousLAngle b) #

sequenceA :: Applicative f => AnonymousLAngle (f a) -> f (AnonymousLAngle a) #

mapM :: Monad m => (a -> m b) -> AnonymousLAngle a -> m (AnonymousLAngle b) #

sequence :: Monad m => AnonymousLAngle (m a) -> m (AnonymousLAngle a) #

SymbolMatching AnonymousLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLAngle 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 (AnonymousLAngle a)

Eq a => Eq (AnonymousLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLAngle a) :: Type -> Type #

Generic1 AnonymousLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLAngle :: k -> Type #

type Rep (AnonymousLAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLAngle a) = D1 (MetaData "AnonymousLAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLAngle = D1 (MetaData "AnonymousLAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousSemicolon a Source #

Constructors

AnonymousSemicolon 

Fields

Instances
Functor AnonymousSemicolon Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousSemicolon Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousSemicolon m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousSemicolon a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousSemicolon a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousSemicolon a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousSemicolon a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousSemicolon a -> b #

foldr1 :: (a -> a -> a) -> AnonymousSemicolon a -> a #

foldl1 :: (a -> a -> a) -> AnonymousSemicolon a -> a #

toList :: AnonymousSemicolon a -> [a] #

null :: AnonymousSemicolon a -> Bool #

length :: AnonymousSemicolon a -> Int #

elem :: Eq a => a -> AnonymousSemicolon a -> Bool #

maximum :: Ord a => AnonymousSemicolon a -> a #

minimum :: Ord a => AnonymousSemicolon a -> a #

sum :: Num a => AnonymousSemicolon a -> a #

product :: Num a => AnonymousSemicolon a -> a #

Traversable AnonymousSemicolon Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousSemicolon Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousSemicolon 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 (AnonymousSemicolon a)

Eq a => Eq (AnonymousSemicolon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousSemicolon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousSemicolon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousSemicolon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousSemicolon a) :: Type -> Type #

Generic1 AnonymousSemicolon Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousSemicolon :: k -> Type #

type Rep (AnonymousSemicolon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousSemicolon a) = D1 (MetaData "AnonymousSemicolon" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSemicolon" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousSemicolon Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousSemicolon = D1 (MetaData "AnonymousSemicolon" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSemicolon" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousColonColon a Source #

Constructors

AnonymousColonColon 

Fields

Instances
Functor AnonymousColonColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousColonColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousColonColon m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousColonColon a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousColonColon a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousColonColon a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousColonColon a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousColonColon a -> b #

foldr1 :: (a -> a -> a) -> AnonymousColonColon a -> a #

foldl1 :: (a -> a -> a) -> AnonymousColonColon a -> a #

toList :: AnonymousColonColon a -> [a] #

null :: AnonymousColonColon a -> Bool #

length :: AnonymousColonColon a -> Int #

elem :: Eq a => a -> AnonymousColonColon a -> Bool #

maximum :: Ord a => AnonymousColonColon a -> a #

minimum :: Ord a => AnonymousColonColon a -> a #

sum :: Num a => AnonymousColonColon a -> a #

product :: Num a => AnonymousColonColon a -> a #

Traversable AnonymousColonColon Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousColonColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousColonColon 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 (AnonymousColonColon a)

Eq a => Eq (AnonymousColonColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousColonColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousColonColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousColonColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousColonColon a) :: Type -> Type #

Generic1 AnonymousColonColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousColonColon :: k -> Type #

type Rep (AnonymousColonColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousColonColon a) = D1 (MetaData "AnonymousColonColon" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousColonColon" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousColonColon Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousColonColon = D1 (MetaData "AnonymousColonColon" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousColonColon" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousColon a Source #

Constructors

AnonymousColon 

Fields

Instances
Functor AnonymousColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousColon a -> AnonymousColon b #

(<$) :: a -> AnonymousColon b -> AnonymousColon a #

Foldable AnonymousColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousColon m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousColon a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousColon a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousColon a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousColon a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousColon a -> b #

foldr1 :: (a -> a -> a) -> AnonymousColon a -> a #

foldl1 :: (a -> a -> a) -> AnonymousColon a -> a #

toList :: AnonymousColon a -> [a] #

null :: AnonymousColon a -> Bool #

length :: AnonymousColon a -> Int #

elem :: Eq a => a -> AnonymousColon a -> Bool #

maximum :: Ord a => AnonymousColon a -> a #

minimum :: Ord a => AnonymousColon a -> a #

sum :: Num a => AnonymousColon a -> a #

product :: Num a => AnonymousColon a -> a #

Traversable AnonymousColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousColon a -> f (AnonymousColon b) #

sequenceA :: Applicative f => AnonymousColon (f a) -> f (AnonymousColon a) #

mapM :: Monad m => (a -> m b) -> AnonymousColon a -> m (AnonymousColon b) #

sequence :: Monad m => AnonymousColon (m a) -> m (AnonymousColon a) #

SymbolMatching AnonymousColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousColon 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 (AnonymousColon a)

Eq a => Eq (AnonymousColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousColon a) :: Type -> Type #

Generic1 AnonymousColon Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousColon :: k -> Type #

type Rep (AnonymousColon a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousColon a) = D1 (MetaData "AnonymousColon" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousColon" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousColon Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousColon = D1 (MetaData "AnonymousColon" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousColon" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousSlashEqual a Source #

Constructors

AnonymousSlashEqual 

Fields

Instances
Functor AnonymousSlashEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousSlashEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousSlashEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousSlashEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousSlashEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousSlashEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousSlashEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousSlashEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousSlashEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousSlashEqual a -> a #

toList :: AnonymousSlashEqual a -> [a] #

null :: AnonymousSlashEqual a -> Bool #

length :: AnonymousSlashEqual a -> Int #

elem :: Eq a => a -> AnonymousSlashEqual a -> Bool #

maximum :: Ord a => AnonymousSlashEqual a -> a #

minimum :: Ord a => AnonymousSlashEqual a -> a #

sum :: Num a => AnonymousSlashEqual a -> a #

product :: Num a => AnonymousSlashEqual a -> a #

Traversable AnonymousSlashEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousSlashEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousSlashEqual 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 (AnonymousSlashEqual a)

Eq a => Eq (AnonymousSlashEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousSlashEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousSlashEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousSlashEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousSlashEqual a) :: Type -> Type #

Generic1 AnonymousSlashEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousSlashEqual :: k -> Type #

type Rep (AnonymousSlashEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousSlashEqual a) = D1 (MetaData "AnonymousSlashEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSlashEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousSlashEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousSlashEqual = D1 (MetaData "AnonymousSlashEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSlashEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousSlash a Source #

Constructors

AnonymousSlash 

Fields

Instances
Functor AnonymousSlash Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousSlash a -> AnonymousSlash b #

(<$) :: a -> AnonymousSlash b -> AnonymousSlash a #

Foldable AnonymousSlash Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousSlash m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousSlash a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousSlash a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousSlash a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousSlash a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousSlash a -> b #

foldr1 :: (a -> a -> a) -> AnonymousSlash a -> a #

foldl1 :: (a -> a -> a) -> AnonymousSlash a -> a #

toList :: AnonymousSlash a -> [a] #

null :: AnonymousSlash a -> Bool #

length :: AnonymousSlash a -> Int #

elem :: Eq a => a -> AnonymousSlash a -> Bool #

maximum :: Ord a => AnonymousSlash a -> a #

minimum :: Ord a => AnonymousSlash a -> a #

sum :: Num a => AnonymousSlash a -> a #

product :: Num a => AnonymousSlash a -> a #

Traversable AnonymousSlash Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousSlash a -> f (AnonymousSlash b) #

sequenceA :: Applicative f => AnonymousSlash (f a) -> f (AnonymousSlash a) #

mapM :: Monad m => (a -> m b) -> AnonymousSlash a -> m (AnonymousSlash b) #

sequence :: Monad m => AnonymousSlash (m a) -> m (AnonymousSlash a) #

SymbolMatching AnonymousSlash Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousSlash 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 (AnonymousSlash a)

Eq a => Eq (AnonymousSlash a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousSlash a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousSlash a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousSlash a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousSlash a) :: Type -> Type #

Generic1 AnonymousSlash Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousSlash :: k -> Type #

type Rep (AnonymousSlash a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousSlash a) = D1 (MetaData "AnonymousSlash" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSlash" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousSlash Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousSlash = D1 (MetaData "AnonymousSlash" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousSlash" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousDotDotDot a Source #

Constructors

AnonymousDotDotDot 

Fields

Instances
Functor AnonymousDotDotDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousDotDotDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousDotDotDot m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousDotDotDot a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousDotDotDot a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousDotDotDot a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousDotDotDot a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousDotDotDot a -> b #

foldr1 :: (a -> a -> a) -> AnonymousDotDotDot a -> a #

foldl1 :: (a -> a -> a) -> AnonymousDotDotDot a -> a #

toList :: AnonymousDotDotDot a -> [a] #

null :: AnonymousDotDotDot a -> Bool #

length :: AnonymousDotDotDot a -> Int #

elem :: Eq a => a -> AnonymousDotDotDot a -> Bool #

maximum :: Ord a => AnonymousDotDotDot a -> a #

minimum :: Ord a => AnonymousDotDotDot a -> a #

sum :: Num a => AnonymousDotDotDot a -> a #

product :: Num a => AnonymousDotDotDot a -> a #

Traversable AnonymousDotDotDot Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousDotDotDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousDotDotDot 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 (AnonymousDotDotDot a)

Eq a => Eq (AnonymousDotDotDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousDotDotDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousDotDotDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousDotDotDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousDotDotDot a) :: Type -> Type #

Generic1 AnonymousDotDotDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousDotDotDot :: k -> Type #

type Rep (AnonymousDotDotDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousDotDotDot a) = D1 (MetaData "AnonymousDotDotDot" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDotDotDot" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousDotDotDot Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousDotDotDot = D1 (MetaData "AnonymousDotDotDot" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDotDotDot" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousDot a Source #

Constructors

AnonymousDot 

Fields

Instances
Functor AnonymousDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousDot a -> AnonymousDot b #

(<$) :: a -> AnonymousDot b -> AnonymousDot a #

Foldable AnonymousDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousDot m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousDot a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousDot a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousDot a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousDot a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousDot a -> b #

foldr1 :: (a -> a -> a) -> AnonymousDot a -> a #

foldl1 :: (a -> a -> a) -> AnonymousDot a -> a #

toList :: AnonymousDot a -> [a] #

null :: AnonymousDot a -> Bool #

length :: AnonymousDot a -> Int #

elem :: Eq a => a -> AnonymousDot a -> Bool #

maximum :: Ord a => AnonymousDot a -> a #

minimum :: Ord a => AnonymousDot a -> a #

sum :: Num a => AnonymousDot a -> a #

product :: Num a => AnonymousDot a -> a #

Traversable AnonymousDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousDot a -> f (AnonymousDot b) #

sequenceA :: Applicative f => AnonymousDot (f a) -> f (AnonymousDot a) #

mapM :: Monad m => (a -> m b) -> AnonymousDot a -> m (AnonymousDot b) #

sequence :: Monad m => AnonymousDot (m a) -> m (AnonymousDot a) #

SymbolMatching AnonymousDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousDot 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 (AnonymousDot a)

Eq a => Eq (AnonymousDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousDot a) :: Type -> Type #

Methods

from :: AnonymousDot a -> Rep (AnonymousDot a) x #

to :: Rep (AnonymousDot a) x -> AnonymousDot a #

Generic1 AnonymousDot Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousDot :: k -> Type #

type Rep (AnonymousDot a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousDot a) = D1 (MetaData "AnonymousDot" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDot" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousDot Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousDot = D1 (MetaData "AnonymousDot" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousDot" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousMinusRAngle a Source #

Constructors

AnonymousMinusRAngle 

Fields

Instances
Functor AnonymousMinusRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousMinusRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousMinusRAngle m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousMinusRAngle a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousMinusRAngle a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousMinusRAngle a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousMinusRAngle a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousMinusRAngle a -> b #

foldr1 :: (a -> a -> a) -> AnonymousMinusRAngle a -> a #

foldl1 :: (a -> a -> a) -> AnonymousMinusRAngle a -> a #

toList :: AnonymousMinusRAngle a -> [a] #

null :: AnonymousMinusRAngle a -> Bool #

length :: AnonymousMinusRAngle a -> Int #

elem :: Eq a => a -> AnonymousMinusRAngle a -> Bool #

maximum :: Ord a => AnonymousMinusRAngle a -> a #

minimum :: Ord a => AnonymousMinusRAngle a -> a #

sum :: Num a => AnonymousMinusRAngle a -> a #

product :: Num a => AnonymousMinusRAngle a -> a #

Traversable AnonymousMinusRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousMinusRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousMinusRAngle 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 (AnonymousMinusRAngle a)

Eq a => Eq (AnonymousMinusRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousMinusRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousMinusRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousMinusRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousMinusRAngle a) :: Type -> Type #

Generic1 AnonymousMinusRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousMinusRAngle :: k -> Type #

type Rep (AnonymousMinusRAngle a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousMinusRAngle a) = D1 (MetaData "AnonymousMinusRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinusRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousMinusRAngle Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousMinusRAngle = D1 (MetaData "AnonymousMinusRAngle" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinusRAngle" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousMinusEqual a Source #

Constructors

AnonymousMinusEqual 

Fields

Instances
Functor AnonymousMinusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousMinusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousMinusEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousMinusEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousMinusEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousMinusEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousMinusEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousMinusEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousMinusEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousMinusEqual a -> a #

toList :: AnonymousMinusEqual a -> [a] #

null :: AnonymousMinusEqual a -> Bool #

length :: AnonymousMinusEqual a -> Int #

elem :: Eq a => a -> AnonymousMinusEqual a -> Bool #

maximum :: Ord a => AnonymousMinusEqual a -> a #

minimum :: Ord a => AnonymousMinusEqual a -> a #

sum :: Num a => AnonymousMinusEqual a -> a #

product :: Num a => AnonymousMinusEqual a -> a #

Traversable AnonymousMinusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousMinusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousMinusEqual 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 (AnonymousMinusEqual a)

Eq a => Eq (AnonymousMinusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousMinusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousMinusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousMinusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousMinusEqual a) :: Type -> Type #

Generic1 AnonymousMinusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousMinusEqual :: k -> Type #

type Rep (AnonymousMinusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousMinusEqual a) = D1 (MetaData "AnonymousMinusEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinusEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousMinusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousMinusEqual = D1 (MetaData "AnonymousMinusEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinusEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousMinusMinus a Source #

Constructors

AnonymousMinusMinus 

Fields

Instances
Functor AnonymousMinusMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousMinusMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousMinusMinus m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousMinusMinus a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousMinusMinus a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousMinusMinus a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousMinusMinus a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousMinusMinus a -> b #

foldr1 :: (a -> a -> a) -> AnonymousMinusMinus a -> a #

foldl1 :: (a -> a -> a) -> AnonymousMinusMinus a -> a #

toList :: AnonymousMinusMinus a -> [a] #

null :: AnonymousMinusMinus a -> Bool #

length :: AnonymousMinusMinus a -> Int #

elem :: Eq a => a -> AnonymousMinusMinus a -> Bool #

maximum :: Ord a => AnonymousMinusMinus a -> a #

minimum :: Ord a => AnonymousMinusMinus a -> a #

sum :: Num a => AnonymousMinusMinus a -> a #

product :: Num a => AnonymousMinusMinus a -> a #

Traversable AnonymousMinusMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousMinusMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousMinusMinus 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 (AnonymousMinusMinus a)

Eq a => Eq (AnonymousMinusMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousMinusMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousMinusMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousMinusMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousMinusMinus a) :: Type -> Type #

Generic1 AnonymousMinusMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousMinusMinus :: k -> Type #

type Rep (AnonymousMinusMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousMinusMinus a) = D1 (MetaData "AnonymousMinusMinus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinusMinus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousMinusMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousMinusMinus = D1 (MetaData "AnonymousMinusMinus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinusMinus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousMinus a Source #

Constructors

AnonymousMinus 

Fields

Instances
Functor AnonymousMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousMinus a -> AnonymousMinus b #

(<$) :: a -> AnonymousMinus b -> AnonymousMinus a #

Foldable AnonymousMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousMinus m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousMinus a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousMinus a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousMinus a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousMinus a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousMinus a -> b #

foldr1 :: (a -> a -> a) -> AnonymousMinus a -> a #

foldl1 :: (a -> a -> a) -> AnonymousMinus a -> a #

toList :: AnonymousMinus a -> [a] #

null :: AnonymousMinus a -> Bool #

length :: AnonymousMinus a -> Int #

elem :: Eq a => a -> AnonymousMinus a -> Bool #

maximum :: Ord a => AnonymousMinus a -> a #

minimum :: Ord a => AnonymousMinus a -> a #

sum :: Num a => AnonymousMinus a -> a #

product :: Num a => AnonymousMinus a -> a #

Traversable AnonymousMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousMinus a -> f (AnonymousMinus b) #

sequenceA :: Applicative f => AnonymousMinus (f a) -> f (AnonymousMinus a) #

mapM :: Monad m => (a -> m b) -> AnonymousMinus a -> m (AnonymousMinus b) #

sequence :: Monad m => AnonymousMinus (m a) -> m (AnonymousMinus a) #

SymbolMatching AnonymousMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousMinus 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 (AnonymousMinus a)

Eq a => Eq (AnonymousMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousMinus a) :: Type -> Type #

Generic1 AnonymousMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousMinus :: k -> Type #

type Rep (AnonymousMinus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousMinus a) = D1 (MetaData "AnonymousMinus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousMinus Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousMinus = D1 (MetaData "AnonymousMinus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousMinus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousComma a Source #

Constructors

AnonymousComma 

Fields

Instances
Functor AnonymousComma Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousComma a -> AnonymousComma b #

(<$) :: a -> AnonymousComma b -> AnonymousComma a #

Foldable AnonymousComma Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousComma m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousComma a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousComma a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousComma a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousComma a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousComma a -> b #

foldr1 :: (a -> a -> a) -> AnonymousComma a -> a #

foldl1 :: (a -> a -> a) -> AnonymousComma a -> a #

toList :: AnonymousComma a -> [a] #

null :: AnonymousComma a -> Bool #

length :: AnonymousComma a -> Int #

elem :: Eq a => a -> AnonymousComma a -> Bool #

maximum :: Ord a => AnonymousComma a -> a #

minimum :: Ord a => AnonymousComma a -> a #

sum :: Num a => AnonymousComma a -> a #

product :: Num a => AnonymousComma a -> a #

Traversable AnonymousComma Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousComma a -> f (AnonymousComma b) #

sequenceA :: Applicative f => AnonymousComma (f a) -> f (AnonymousComma a) #

mapM :: Monad m => (a -> m b) -> AnonymousComma a -> m (AnonymousComma b) #

sequence :: Monad m => AnonymousComma (m a) -> m (AnonymousComma a) #

SymbolMatching AnonymousComma Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousComma 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 (AnonymousComma a)

Eq a => Eq (AnonymousComma a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousComma a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousComma a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousComma a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousComma a) :: Type -> Type #

Generic1 AnonymousComma Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousComma :: k -> Type #

type Rep (AnonymousComma a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousComma a) = D1 (MetaData "AnonymousComma" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousComma" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousComma Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousComma = D1 (MetaData "AnonymousComma" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousComma" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPlusEqual a Source #

Constructors

AnonymousPlusEqual 

Fields

Instances
Functor AnonymousPlusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousPlusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousPlusEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousPlusEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousPlusEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousPlusEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousPlusEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousPlusEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousPlusEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousPlusEqual a -> a #

toList :: AnonymousPlusEqual a -> [a] #

null :: AnonymousPlusEqual a -> Bool #

length :: AnonymousPlusEqual a -> Int #

elem :: Eq a => a -> AnonymousPlusEqual a -> Bool #

maximum :: Ord a => AnonymousPlusEqual a -> a #

minimum :: Ord a => AnonymousPlusEqual a -> a #

sum :: Num a => AnonymousPlusEqual a -> a #

product :: Num a => AnonymousPlusEqual a -> a #

Traversable AnonymousPlusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousPlusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousPlusEqual 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 (AnonymousPlusEqual a)

Eq a => Eq (AnonymousPlusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousPlusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousPlusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousPlusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousPlusEqual a) :: Type -> Type #

Generic1 AnonymousPlusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPlusEqual :: k -> Type #

type Rep (AnonymousPlusEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousPlusEqual a) = D1 (MetaData "AnonymousPlusEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPlusEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousPlusEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPlusEqual = D1 (MetaData "AnonymousPlusEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPlusEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPlusPlus a Source #

Constructors

AnonymousPlusPlus 

Fields

Instances
Functor AnonymousPlusPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousPlusPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousPlusPlus m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousPlusPlus a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousPlusPlus a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousPlusPlus a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousPlusPlus a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousPlusPlus a -> b #

foldr1 :: (a -> a -> a) -> AnonymousPlusPlus a -> a #

foldl1 :: (a -> a -> a) -> AnonymousPlusPlus a -> a #

toList :: AnonymousPlusPlus a -> [a] #

null :: AnonymousPlusPlus a -> Bool #

length :: AnonymousPlusPlus a -> Int #

elem :: Eq a => a -> AnonymousPlusPlus a -> Bool #

maximum :: Ord a => AnonymousPlusPlus a -> a #

minimum :: Ord a => AnonymousPlusPlus a -> a #

sum :: Num a => AnonymousPlusPlus a -> a #

product :: Num a => AnonymousPlusPlus a -> a #

Traversable AnonymousPlusPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousPlusPlus a -> f (AnonymousPlusPlus b) #

sequenceA :: Applicative f => AnonymousPlusPlus (f a) -> f (AnonymousPlusPlus a) #

mapM :: Monad m => (a -> m b) -> AnonymousPlusPlus a -> m (AnonymousPlusPlus b) #

sequence :: Monad m => AnonymousPlusPlus (m a) -> m (AnonymousPlusPlus a) #

SymbolMatching AnonymousPlusPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousPlusPlus 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 (AnonymousPlusPlus a)

Eq a => Eq (AnonymousPlusPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousPlusPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousPlusPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousPlusPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousPlusPlus a) :: Type -> Type #

Generic1 AnonymousPlusPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPlusPlus :: k -> Type #

type Rep (AnonymousPlusPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousPlusPlus a) = D1 (MetaData "AnonymousPlusPlus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPlusPlus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousPlusPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPlusPlus = D1 (MetaData "AnonymousPlusPlus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPlusPlus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPlus a Source #

Constructors

AnonymousPlus 

Fields

Instances
Functor AnonymousPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousPlus a -> AnonymousPlus b #

(<$) :: a -> AnonymousPlus b -> AnonymousPlus a #

Foldable AnonymousPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousPlus m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousPlus a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousPlus a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousPlus a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousPlus a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousPlus a -> b #

foldr1 :: (a -> a -> a) -> AnonymousPlus a -> a #

foldl1 :: (a -> a -> a) -> AnonymousPlus a -> a #

toList :: AnonymousPlus a -> [a] #

null :: AnonymousPlus a -> Bool #

length :: AnonymousPlus a -> Int #

elem :: Eq a => a -> AnonymousPlus a -> Bool #

maximum :: Ord a => AnonymousPlus a -> a #

minimum :: Ord a => AnonymousPlus a -> a #

sum :: Num a => AnonymousPlus a -> a #

product :: Num a => AnonymousPlus a -> a #

Traversable AnonymousPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousPlus a -> f (AnonymousPlus b) #

sequenceA :: Applicative f => AnonymousPlus (f a) -> f (AnonymousPlus a) #

mapM :: Monad m => (a -> m b) -> AnonymousPlus a -> m (AnonymousPlus b) #

sequence :: Monad m => AnonymousPlus (m a) -> m (AnonymousPlus a) #

SymbolMatching AnonymousPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousPlus 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 (AnonymousPlus a)

Eq a => Eq (AnonymousPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousPlus a) :: Type -> Type #

Generic1 AnonymousPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPlus :: k -> Type #

type Rep (AnonymousPlus a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousPlus a) = D1 (MetaData "AnonymousPlus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPlus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousPlus Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPlus = D1 (MetaData "AnonymousPlus" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPlus" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousStarEqual a Source #

Constructors

AnonymousStarEqual 

Fields

Instances
Functor AnonymousStarEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousStarEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousStarEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousStarEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousStarEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousStarEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousStarEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousStarEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousStarEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousStarEqual a -> a #

toList :: AnonymousStarEqual a -> [a] #

null :: AnonymousStarEqual a -> Bool #

length :: AnonymousStarEqual a -> Int #

elem :: Eq a => a -> AnonymousStarEqual a -> Bool #

maximum :: Ord a => AnonymousStarEqual a -> a #

minimum :: Ord a => AnonymousStarEqual a -> a #

sum :: Num a => AnonymousStarEqual a -> a #

product :: Num a => AnonymousStarEqual a -> a #

Traversable AnonymousStarEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousStarEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousStarEqual 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 (AnonymousStarEqual a)

Eq a => Eq (AnonymousStarEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousStarEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousStarEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousStarEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousStarEqual a) :: Type -> Type #

Generic1 AnonymousStarEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousStarEqual :: k -> Type #

type Rep (AnonymousStarEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousStarEqual a) = D1 (MetaData "AnonymousStarEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousStarEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousStarEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousStarEqual = D1 (MetaData "AnonymousStarEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousStarEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousStar a Source #

Constructors

AnonymousStar 

Fields

Instances
Functor AnonymousStar Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousStar a -> AnonymousStar b #

(<$) :: a -> AnonymousStar b -> AnonymousStar a #

Foldable AnonymousStar Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousStar m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousStar a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousStar a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousStar a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousStar a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousStar a -> b #

foldr1 :: (a -> a -> a) -> AnonymousStar a -> a #

foldl1 :: (a -> a -> a) -> AnonymousStar a -> a #

toList :: AnonymousStar a -> [a] #

null :: AnonymousStar a -> Bool #

length :: AnonymousStar a -> Int #

elem :: Eq a => a -> AnonymousStar a -> Bool #

maximum :: Ord a => AnonymousStar a -> a #

minimum :: Ord a => AnonymousStar a -> a #

sum :: Num a => AnonymousStar a -> a #

product :: Num a => AnonymousStar a -> a #

Traversable AnonymousStar Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousStar a -> f (AnonymousStar b) #

sequenceA :: Applicative f => AnonymousStar (f a) -> f (AnonymousStar a) #

mapM :: Monad m => (a -> m b) -> AnonymousStar a -> m (AnonymousStar b) #

sequence :: Monad m => AnonymousStar (m a) -> m (AnonymousStar a) #

SymbolMatching AnonymousStar Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousStar 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 (AnonymousStar a)

Eq a => Eq (AnonymousStar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousStar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousStar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousStar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousStar a) :: Type -> Type #

Generic1 AnonymousStar Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousStar :: k -> Type #

type Rep (AnonymousStar a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousStar a) = D1 (MetaData "AnonymousStar" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousStar" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousStar Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousStar = D1 (MetaData "AnonymousStar" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousStar" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousRParen a Source #

Constructors

AnonymousRParen 

Fields

Instances
Functor AnonymousRParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousRParen a -> AnonymousRParen b #

(<$) :: a -> AnonymousRParen b -> AnonymousRParen a #

Foldable AnonymousRParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousRParen m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousRParen a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousRParen a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousRParen a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousRParen a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousRParen a -> b #

foldr1 :: (a -> a -> a) -> AnonymousRParen a -> a #

foldl1 :: (a -> a -> a) -> AnonymousRParen a -> a #

toList :: AnonymousRParen a -> [a] #

null :: AnonymousRParen a -> Bool #

length :: AnonymousRParen a -> Int #

elem :: Eq a => a -> AnonymousRParen a -> Bool #

maximum :: Ord a => AnonymousRParen a -> a #

minimum :: Ord a => AnonymousRParen a -> a #

sum :: Num a => AnonymousRParen a -> a #

product :: Num a => AnonymousRParen a -> a #

Traversable AnonymousRParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousRParen a -> f (AnonymousRParen b) #

sequenceA :: Applicative f => AnonymousRParen (f a) -> f (AnonymousRParen a) #

mapM :: Monad m => (a -> m b) -> AnonymousRParen a -> m (AnonymousRParen b) #

sequence :: Monad m => AnonymousRParen (m a) -> m (AnonymousRParen a) #

SymbolMatching AnonymousRParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousRParen 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 (AnonymousRParen a)

Eq a => Eq (AnonymousRParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousRParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousRParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousRParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousRParen a) :: Type -> Type #

Generic1 AnonymousRParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousRParen :: k -> Type #

type Rep (AnonymousRParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousRParen a) = D1 (MetaData "AnonymousRParen" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRParen" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousRParen Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousRParen = D1 (MetaData "AnonymousRParen" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousRParen" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousLParen a Source #

Constructors

AnonymousLParen 

Fields

Instances
Functor AnonymousLParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousLParen a -> AnonymousLParen b #

(<$) :: a -> AnonymousLParen b -> AnonymousLParen a #

Foldable AnonymousLParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousLParen m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousLParen a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousLParen a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousLParen a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousLParen a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousLParen a -> b #

foldr1 :: (a -> a -> a) -> AnonymousLParen a -> a #

foldl1 :: (a -> a -> a) -> AnonymousLParen a -> a #

toList :: AnonymousLParen a -> [a] #

null :: AnonymousLParen a -> Bool #

length :: AnonymousLParen a -> Int #

elem :: Eq a => a -> AnonymousLParen a -> Bool #

maximum :: Ord a => AnonymousLParen a -> a #

minimum :: Ord a => AnonymousLParen a -> a #

sum :: Num a => AnonymousLParen a -> a #

product :: Num a => AnonymousLParen a -> a #

Traversable AnonymousLParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousLParen a -> f (AnonymousLParen b) #

sequenceA :: Applicative f => AnonymousLParen (f a) -> f (AnonymousLParen a) #

mapM :: Monad m => (a -> m b) -> AnonymousLParen a -> m (AnonymousLParen b) #

sequence :: Monad m => AnonymousLParen (m a) -> m (AnonymousLParen a) #

SymbolMatching AnonymousLParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousLParen 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 (AnonymousLParen a)

Eq a => Eq (AnonymousLParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousLParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousLParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousLParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousLParen a) :: Type -> Type #

Generic1 AnonymousLParen Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousLParen :: k -> Type #

type Rep (AnonymousLParen a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousLParen a) = D1 (MetaData "AnonymousLParen" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLParen" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousLParen Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousLParen = D1 (MetaData "AnonymousLParen" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousLParen" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousAmpersandEqual a Source #

Constructors

AnonymousAmpersandEqual 

Fields

Instances
Functor AnonymousAmpersandEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousAmpersandEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousAmpersandEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousAmpersandEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousAmpersandEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousAmpersandEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousAmpersandEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousAmpersandEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousAmpersandEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousAmpersandEqual a -> a #

toList :: AnonymousAmpersandEqual a -> [a] #

null :: AnonymousAmpersandEqual a -> Bool #

length :: AnonymousAmpersandEqual a -> Int #

elem :: Eq a => a -> AnonymousAmpersandEqual a -> Bool #

maximum :: Ord a => AnonymousAmpersandEqual a -> a #

minimum :: Ord a => AnonymousAmpersandEqual a -> a #

sum :: Num a => AnonymousAmpersandEqual a -> a #

product :: Num a => AnonymousAmpersandEqual a -> a #

Traversable AnonymousAmpersandEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousAmpersandEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAmpersandEqual 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 (AnonymousAmpersandEqual a)

Eq a => Eq (AnonymousAmpersandEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAmpersandEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAmpersandEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAmpersandEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAmpersandEqual a) :: Type -> Type #

Generic1 AnonymousAmpersandEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAmpersandEqual :: k -> Type #

type Rep (AnonymousAmpersandEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAmpersandEqual a) = D1 (MetaData "AnonymousAmpersandEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAmpersandEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAmpersandEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAmpersandEqual = D1 (MetaData "AnonymousAmpersandEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAmpersandEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousAmpersandAmpersand a Source #

Constructors

AnonymousAmpersandAmpersand 

Fields

Instances
Functor AnonymousAmpersandAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousAmpersandAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Traversable AnonymousAmpersandAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousAmpersandAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAmpersandAmpersand 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 (AnonymousAmpersandAmpersand a)

Eq a => Eq (AnonymousAmpersandAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAmpersandAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAmpersandAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAmpersandAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAmpersandAmpersand a) :: Type -> Type #

Generic1 AnonymousAmpersandAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAmpersandAmpersand :: k -> Type #

type Rep (AnonymousAmpersandAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAmpersandAmpersand a) = D1 (MetaData "AnonymousAmpersandAmpersand" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAmpersandAmpersand" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAmpersandAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAmpersandAmpersand = D1 (MetaData "AnonymousAmpersandAmpersand" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAmpersandAmpersand" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousAmpersand a Source #

Constructors

AnonymousAmpersand 

Fields

Instances
Functor AnonymousAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousAmpersand m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousAmpersand a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousAmpersand a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousAmpersand a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousAmpersand a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousAmpersand a -> b #

foldr1 :: (a -> a -> a) -> AnonymousAmpersand a -> a #

foldl1 :: (a -> a -> a) -> AnonymousAmpersand a -> a #

toList :: AnonymousAmpersand a -> [a] #

null :: AnonymousAmpersand a -> Bool #

length :: AnonymousAmpersand a -> Int #

elem :: Eq a => a -> AnonymousAmpersand a -> Bool #

maximum :: Ord a => AnonymousAmpersand a -> a #

minimum :: Ord a => AnonymousAmpersand a -> a #

sum :: Num a => AnonymousAmpersand a -> a #

product :: Num a => AnonymousAmpersand a -> a #

Traversable AnonymousAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousAmpersand 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 (AnonymousAmpersand a)

Eq a => Eq (AnonymousAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousAmpersand a) :: Type -> Type #

Generic1 AnonymousAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousAmpersand :: k -> Type #

type Rep (AnonymousAmpersand a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousAmpersand a) = D1 (MetaData "AnonymousAmpersand" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAmpersand" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousAmpersand Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousAmpersand = D1 (MetaData "AnonymousAmpersand" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousAmpersand" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPercentEqual a Source #

Constructors

AnonymousPercentEqual 

Fields

Instances
Functor AnonymousPercentEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousPercentEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousPercentEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousPercentEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousPercentEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousPercentEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousPercentEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousPercentEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousPercentEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousPercentEqual a -> a #

toList :: AnonymousPercentEqual a -> [a] #

null :: AnonymousPercentEqual a -> Bool #

length :: AnonymousPercentEqual a -> Int #

elem :: Eq a => a -> AnonymousPercentEqual a -> Bool #

maximum :: Ord a => AnonymousPercentEqual a -> a #

minimum :: Ord a => AnonymousPercentEqual a -> a #

sum :: Num a => AnonymousPercentEqual a -> a #

product :: Num a => AnonymousPercentEqual a -> a #

Traversable AnonymousPercentEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousPercentEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousPercentEqual 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 (AnonymousPercentEqual a)

Eq a => Eq (AnonymousPercentEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousPercentEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousPercentEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousPercentEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousPercentEqual a) :: Type -> Type #

Generic1 AnonymousPercentEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPercentEqual :: k -> Type #

type Rep (AnonymousPercentEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousPercentEqual a) = D1 (MetaData "AnonymousPercentEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPercentEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousPercentEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPercentEqual = D1 (MetaData "AnonymousPercentEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPercentEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousPercent a Source #

Constructors

AnonymousPercent 

Fields

Instances
Functor AnonymousPercent Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousPercent a -> AnonymousPercent b #

(<$) :: a -> AnonymousPercent b -> AnonymousPercent a #

Foldable AnonymousPercent Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousPercent m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousPercent a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousPercent a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousPercent a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousPercent a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousPercent a -> b #

foldr1 :: (a -> a -> a) -> AnonymousPercent a -> a #

foldl1 :: (a -> a -> a) -> AnonymousPercent a -> a #

toList :: AnonymousPercent a -> [a] #

null :: AnonymousPercent a -> Bool #

length :: AnonymousPercent a -> Int #

elem :: Eq a => a -> AnonymousPercent a -> Bool #

maximum :: Ord a => AnonymousPercent a -> a #

minimum :: Ord a => AnonymousPercent a -> a #

sum :: Num a => AnonymousPercent a -> a #

product :: Num a => AnonymousPercent a -> a #

Traversable AnonymousPercent Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousPercent a -> f (AnonymousPercent b) #

sequenceA :: Applicative f => AnonymousPercent (f a) -> f (AnonymousPercent a) #

mapM :: Monad m => (a -> m b) -> AnonymousPercent a -> m (AnonymousPercent b) #

sequence :: Monad m => AnonymousPercent (m a) -> m (AnonymousPercent a) #

SymbolMatching AnonymousPercent Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousPercent 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 (AnonymousPercent a)

Eq a => Eq (AnonymousPercent a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousPercent a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousPercent a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousPercent a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousPercent a) :: Type -> Type #

Generic1 AnonymousPercent Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousPercent :: k -> Type #

type Rep (AnonymousPercent a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousPercent a) = D1 (MetaData "AnonymousPercent" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPercent" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousPercent Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousPercent = D1 (MetaData "AnonymousPercent" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousPercent" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousBangEqual a Source #

Constructors

AnonymousBangEqual 

Fields

Instances
Functor AnonymousBangEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Foldable AnonymousBangEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousBangEqual m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousBangEqual a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousBangEqual a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousBangEqual a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousBangEqual a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousBangEqual a -> b #

foldr1 :: (a -> a -> a) -> AnonymousBangEqual a -> a #

foldl1 :: (a -> a -> a) -> AnonymousBangEqual a -> a #

toList :: AnonymousBangEqual a -> [a] #

null :: AnonymousBangEqual a -> Bool #

length :: AnonymousBangEqual a -> Int #

elem :: Eq a => a -> AnonymousBangEqual a -> Bool #

maximum :: Ord a => AnonymousBangEqual a -> a #

minimum :: Ord a => AnonymousBangEqual a -> a #

sum :: Num a => AnonymousBangEqual a -> a #

product :: Num a => AnonymousBangEqual a -> a #

Traversable AnonymousBangEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

SymbolMatching AnonymousBangEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousBangEqual 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 (AnonymousBangEqual a)

Eq a => Eq (AnonymousBangEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousBangEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousBangEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousBangEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousBangEqual a) :: Type -> Type #

Generic1 AnonymousBangEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousBangEqual :: k -> Type #

type Rep (AnonymousBangEqual a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousBangEqual a) = D1 (MetaData "AnonymousBangEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousBangEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousBangEqual Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousBangEqual = D1 (MetaData "AnonymousBangEqual" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousBangEqual" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

newtype AnonymousBang a Source #

Constructors

AnonymousBang 

Fields

Instances
Functor AnonymousBang Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fmap :: (a -> b) -> AnonymousBang a -> AnonymousBang b #

(<$) :: a -> AnonymousBang b -> AnonymousBang a #

Foldable AnonymousBang Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

fold :: Monoid m => AnonymousBang m -> m #

foldMap :: Monoid m => (a -> m) -> AnonymousBang a -> m #

foldr :: (a -> b -> b) -> b -> AnonymousBang a -> b #

foldr' :: (a -> b -> b) -> b -> AnonymousBang a -> b #

foldl :: (b -> a -> b) -> b -> AnonymousBang a -> b #

foldl' :: (b -> a -> b) -> b -> AnonymousBang a -> b #

foldr1 :: (a -> a -> a) -> AnonymousBang a -> a #

foldl1 :: (a -> a -> a) -> AnonymousBang a -> a #

toList :: AnonymousBang a -> [a] #

null :: AnonymousBang a -> Bool #

length :: AnonymousBang a -> Int #

elem :: Eq a => a -> AnonymousBang a -> Bool #

maximum :: Ord a => AnonymousBang a -> a #

minimum :: Ord a => AnonymousBang a -> a #

sum :: Num a => AnonymousBang a -> a #

product :: Num a => AnonymousBang a -> a #

Traversable AnonymousBang Source # 
Instance details

Defined in TreeSitter.Java.AST

Methods

traverse :: Applicative f => (a -> f b) -> AnonymousBang a -> f (AnonymousBang b) #

sequenceA :: Applicative f => AnonymousBang (f a) -> f (AnonymousBang a) #

mapM :: Monad m => (a -> m b) -> AnonymousBang a -> m (AnonymousBang b) #

sequence :: Monad m => AnonymousBang (m a) -> m (AnonymousBang a) #

SymbolMatching AnonymousBang Source # 
Instance details

Defined in TreeSitter.Java.AST

Unmarshal AnonymousBang 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 (AnonymousBang a)

Eq a => Eq (AnonymousBang a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Ord a => Ord (AnonymousBang a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Show a => Show (AnonymousBang a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Generic (AnonymousBang a) Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep (AnonymousBang a) :: Type -> Type #

Generic1 AnonymousBang Source # 
Instance details

Defined in TreeSitter.Java.AST

Associated Types

type Rep1 AnonymousBang :: k -> Type #

type Rep (AnonymousBang a) Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep (AnonymousBang a) = D1 (MetaData "AnonymousBang" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousBang" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)))
type Rep1 AnonymousBang Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 AnonymousBang = D1 (MetaData "AnonymousBang" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" True) (C1 (MetaCons "AnonymousBang" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1))

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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.0.0-inplace" False) (C1 (MetaCons "RequiresModifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "RequiresModifier" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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 #

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.3.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 (NonEmpty ((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.3.0.0-inplace" False) (C1 (MetaCons "Modifiers" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: 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.3.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.3.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.3.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.3.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.3.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.3.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.3.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 [VariableDeclarator a])) :*: (S1 (MetaSel (Just "type'") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (UnannotatedType a)) :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty (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.3.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.3.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.3.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.3.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.3.0.0-inplace" False) (C1 (MetaCons "IntegralType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "IntegralType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.0.0-inplace" False) (C1 (MetaCons "FloatingPointType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "FloatingPointType" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.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.3.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 #

Constructors

FieldDeclaration 
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.3.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.3.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.3.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.3.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.3.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.3.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 #

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.3.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.3.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.3.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.3.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.3.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.3.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 #

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.3.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 (NonEmpty ((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.3.0.0-inplace" False) (C1 (MetaCons "Dimensions" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (NonEmpty :.: 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.3.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.3.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.3.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.3.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.3.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 (NonEmpty ((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.3.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.3.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.3.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.3.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.3.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 [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.3.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.3.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.3.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.3.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.3.0.0-inplace" False) (C1 (MetaCons "Asterisk" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a) :*: S1 (MetaSel (Just "bytes") 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.3.0.0-inplace" False) (C1 (MetaCons "Asterisk" PrefixI True) (S1 (MetaSel (Just "ann") NoSourceUnpackedness NoSourceStrictness DecidedLazy) Par1 :*: S1 (MetaSel (Just "bytes") 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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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.3.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)))))

data 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.3.0.0-inplace" False) (((C1 (MetaCons "ArrayTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayType a))) :+: C1 (MetaCons "BooleanTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (BooleanType a)))) :+: (C1 (MetaCons "FloatingPointTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (FloatingPointType a))) :+: C1 (MetaCons "GenericTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (GenericType a))))) :+: ((C1 (MetaCons "IntegralTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (IntegralType a))) :+: C1 (MetaCons "ScopedTypeIdentifierUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ScopedTypeIdentifier a)))) :+: (C1 (MetaCons "TypeIdentifierUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TypeIdentifier a))) :+: C1 (MetaCons "VoidTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (VoidType 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.3.0.0-inplace" False) (((C1 (MetaCons "ArrayTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ArrayType)) :+: C1 (MetaCons "BooleanTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 BooleanType))) :+: (C1 (MetaCons "FloatingPointTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 FloatingPointType)) :+: C1 (MetaCons "GenericTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 GenericType)))) :+: ((C1 (MetaCons "IntegralTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 IntegralType)) :+: C1 (MetaCons "ScopedTypeIdentifierUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ScopedTypeIdentifier))) :+: (C1 (MetaCons "TypeIdentifierUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 TypeIdentifier)) :+: C1 (MetaCons "VoidTypeUnannotatedType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 VoidType)))))

data 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.3.0.0-inplace" False) (C1 (MetaCons "UnannotatedTypeType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (UnannotatedType a))) :+: C1 (MetaCons "AnnotatedTypeType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (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.3.0.0-inplace" False) (C1 (MetaCons "UnannotatedTypeType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 UnannotatedType)) :+: C1 (MetaCons "AnnotatedTypeType" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 AnnotatedType)))

data 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 Rep (Statement a) = D1 (MetaData "Statement" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) ((((C1 (MetaCons "AnonymousSemicolonStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (AnonymousSemicolon a))) :+: C1 (MetaCons "DeclarationStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Declaration a)))) :+: (C1 (MetaCons "AssertStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (AssertStatement a))) :+: (C1 (MetaCons "BlockStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Block a))) :+: C1 (MetaCons "BreakStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (BreakStatement a)))))) :+: ((C1 (MetaCons "ContinueStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ContinueStatement a))) :+: C1 (MetaCons "DoStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (DoStatement a)))) :+: (C1 (MetaCons "EnhancedForStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (EnhancedForStatement a))) :+: (C1 (MetaCons "ExpressionStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ExpressionStatement a))) :+: C1 (MetaCons "ForStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ForStatement a))))))) :+: (((C1 (MetaCons "IfStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (IfStatement a))) :+: C1 (MetaCons "LabeledStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LabeledStatement a)))) :+: (C1 (MetaCons "LocalVariableDeclarationStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LocalVariableDeclarationStatement a))) :+: (C1 (MetaCons "ReturnStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ReturnStatement a))) :+: C1 (MetaCons "SwitchStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SwitchStatement a)))))) :+: ((C1 (MetaCons "SynchronizedStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (SynchronizedStatement a))) :+: C1 (MetaCons "ThrowStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ThrowStatement a)))) :+: (C1 (MetaCons "TryStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TryStatement a))) :+: (C1 (MetaCons "TryWithResourcesStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TryWithResourcesStatement a))) :+: C1 (MetaCons "WhileStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (WhileStatement a))))))))
type Rep1 Statement Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Statement = D1 (MetaData "Statement" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) ((((C1 (MetaCons "AnonymousSemicolonStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 AnonymousSemicolon)) :+: C1 (MetaCons "DeclarationStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Declaration))) :+: (C1 (MetaCons "AssertStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 AssertStatement)) :+: (C1 (MetaCons "BlockStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Block)) :+: C1 (MetaCons "BreakStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 BreakStatement))))) :+: ((C1 (MetaCons "ContinueStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ContinueStatement)) :+: C1 (MetaCons "DoStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 DoStatement))) :+: (C1 (MetaCons "EnhancedForStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 EnhancedForStatement)) :+: (C1 (MetaCons "ExpressionStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ExpressionStatement)) :+: C1 (MetaCons "ForStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ForStatement)))))) :+: (((C1 (MetaCons "IfStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 IfStatement)) :+: C1 (MetaCons "LabeledStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 LabeledStatement))) :+: (C1 (MetaCons "LocalVariableDeclarationStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 LocalVariableDeclarationStatement)) :+: (C1 (MetaCons "ReturnStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ReturnStatement)) :+: C1 (MetaCons "SwitchStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 SwitchStatement))))) :+: ((C1 (MetaCons "SynchronizedStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 SynchronizedStatement)) :+: C1 (MetaCons "ThrowStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ThrowStatement))) :+: (C1 (MetaCons "TryStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 TryStatement)) :+: (C1 (MetaCons "TryWithResourcesStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 TryWithResourcesStatement)) :+: C1 (MetaCons "WhileStatementStatement" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 WhileStatement)))))))

data 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

data 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 Rep (Primary a) = D1 (MetaData "Primary" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) (((C1 (MetaCons "LiteralPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Literal a))) :+: C1 (MetaCons "ArrayAccessPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayAccess a)))) :+: (C1 (MetaCons "ArrayCreationExpressionPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ArrayCreationExpression a))) :+: (C1 (MetaCons "ClassLiteralPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ClassLiteral a))) :+: C1 (MetaCons "FieldAccessPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (FieldAccess a)))))) :+: ((C1 (MetaCons "MethodInvocationPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (MethodInvocation a))) :+: C1 (MetaCons "MethodReferencePrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (MethodReference a)))) :+: (C1 (MetaCons "ObjectCreationExpressionPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ObjectCreationExpression a))) :+: (C1 (MetaCons "ParenthesizedExpressionPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ParenthesizedExpression a))) :+: C1 (MetaCons "ThisPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (This a)))))))
type Rep1 Primary Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Primary = D1 (MetaData "Primary" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) (((C1 (MetaCons "LiteralPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Literal)) :+: C1 (MetaCons "ArrayAccessPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ArrayAccess))) :+: (C1 (MetaCons "ArrayCreationExpressionPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ArrayCreationExpression)) :+: (C1 (MetaCons "ClassLiteralPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ClassLiteral)) :+: C1 (MetaCons "FieldAccessPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 FieldAccess))))) :+: ((C1 (MetaCons "MethodInvocationPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 MethodInvocation)) :+: C1 (MetaCons "MethodReferencePrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 MethodReference))) :+: (C1 (MetaCons "ObjectCreationExpressionPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ObjectCreationExpression)) :+: (C1 (MetaCons "ParenthesizedExpressionPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ParenthesizedExpression)) :+: C1 (MetaCons "ThisPrimary" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 This))))))

data 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 Rep (Literal a) = D1 (MetaData "Literal" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) (((C1 (MetaCons "BinaryIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (BinaryIntegerLiteral a))) :+: C1 (MetaCons "CharacterLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CharacterLiteral a)))) :+: (C1 (MetaCons "DecimalFloatingPointLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (DecimalFloatingPointLiteral a))) :+: (C1 (MetaCons "DecimalIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (DecimalIntegerLiteral a))) :+: C1 (MetaCons "FalseLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (False a)))))) :+: ((C1 (MetaCons "HexFloatingPointLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HexFloatingPointLiteral a))) :+: (C1 (MetaCons "HexIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HexIntegerLiteral a))) :+: C1 (MetaCons "NullLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NullLiteral a))))) :+: (C1 (MetaCons "OctalIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (OctalIntegerLiteral a))) :+: (C1 (MetaCons "StringLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (StringLiteral a))) :+: C1 (MetaCons "TrueLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (True a)))))))
type Rep1 Literal Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Literal = D1 (MetaData "Literal" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) (((C1 (MetaCons "BinaryIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 BinaryIntegerLiteral)) :+: C1 (MetaCons "CharacterLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 CharacterLiteral))) :+: (C1 (MetaCons "DecimalFloatingPointLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 DecimalFloatingPointLiteral)) :+: (C1 (MetaCons "DecimalIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 DecimalIntegerLiteral)) :+: C1 (MetaCons "FalseLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 False))))) :+: ((C1 (MetaCons "HexFloatingPointLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 HexFloatingPointLiteral)) :+: (C1 (MetaCons "HexIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 HexIntegerLiteral)) :+: C1 (MetaCons "NullLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 NullLiteral)))) :+: (C1 (MetaCons "OctalIntegerLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 OctalIntegerLiteral)) :+: (C1 (MetaCons "StringLiteralLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 StringLiteral)) :+: C1 (MetaCons "TrueLiteral" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 True))))))

data 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 Rep (Expression a) = D1 (MetaData "Expression" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) (((C1 (MetaCons "PrimaryExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Primary a))) :+: C1 (MetaCons "AssignmentExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (AssignmentExpression a)))) :+: (C1 (MetaCons "BinaryExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (BinaryExpression a))) :+: (C1 (MetaCons "CastExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CastExpression a))) :+: C1 (MetaCons "IdentifierExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Identifier a)))))) :+: ((C1 (MetaCons "InstanceofExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (InstanceofExpression a))) :+: (C1 (MetaCons "LambdaExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (LambdaExpression a))) :+: C1 (MetaCons "ScopedIdentifierExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (ScopedIdentifier a))))) :+: (C1 (MetaCons "TernaryExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TernaryExpression a))) :+: (C1 (MetaCons "UnaryExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (UnaryExpression a))) :+: C1 (MetaCons "UpdateExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (UpdateExpression a)))))))
type Rep1 Expression Source # 
Instance details

Defined in TreeSitter.Java.AST

type Rep1 Expression = D1 (MetaData "Expression" "TreeSitter.Java.AST" "tree-sitter-java-0.3.0.0-inplace" False) (((C1 (MetaCons "PrimaryExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Primary)) :+: C1 (MetaCons "AssignmentExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 AssignmentExpression))) :+: (C1 (MetaCons "BinaryExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 BinaryExpression)) :+: (C1 (MetaCons "CastExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 CastExpression)) :+: C1 (MetaCons "IdentifierExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 Identifier))))) :+: ((C1 (MetaCons "InstanceofExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 InstanceofExpression)) :+: (C1 (MetaCons "LambdaExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 LambdaExpression)) :+: C1 (MetaCons "ScopedIdentifierExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 ScopedIdentifier)))) :+: (C1 (MetaCons "TernaryExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 TernaryExpression)) :+: (C1 (MetaCons "UnaryExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 UnaryExpression)) :+: C1 (MetaCons "UpdateExpressionExpression" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec1 UpdateExpression))))))

data 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