tree-sitter-tsx-0.4.0.0: Tree-sitter grammar/parser for TSX
Safe HaskellNone
LanguageHaskell2010

TreeSitter.TSX.AST

Documentation

type AnonymousTilde = Token "~" 90 Source #

type AnonymousRBrace = Token "}" 11 Source #

type AnonymousPipeRBrace = Token "|}" 139 Source #

type AnonymousPipePipe = Token "||" 71 Source #

type AnonymousPipeEqual = Token "|=" 63 Source #

type AnonymousPipe = Token "|" 77 Source #

type AnonymousLBracePipe = Token "{|" 138 Source #

type AnonymousLBrace = Token "{" 9 Source #

type AnonymousYield = Token "yield" 42 Source #

type AnonymousWith = Token "with" 31 Source #

type AnonymousWhile = Token "while" 28 Source #

type AnonymousVoid = Token "void" 91 Source #

type AnonymousVar = Token "var" 16 Source #

data Undefined a Source #

Constructors

Undefined 

Fields

Instances

Instances details
Functor Undefined Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable Undefined Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> Undefined a -> m #

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

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

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

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

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

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

toList :: Undefined a -> [a] #

null :: Undefined a -> Bool #

length :: Undefined a -> Int #

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

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

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

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

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

Traversable Undefined Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching Undefined Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy Undefined -> Node -> Bool

showFailure :: Proxy Undefined -> Node -> String

Unmarshal Undefined Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Undefined a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (Undefined a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 Undefined Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 Undefined :: k -> Type #

Methods

from1 :: forall (a :: k). Undefined a -> Rep1 Undefined a #

to1 :: forall (a :: k). Rep1 Undefined a -> Undefined a #

type Rep (Undefined a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousTypeof = Token "typeof" 13 Source #

data TypeIdentifier a Source #

Constructors

TypeIdentifier 

Fields

Instances

Instances details
Functor TypeIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable TypeIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> TypeIdentifier a -> 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.TSX.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.TSX.AST

Unmarshal TypeIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeIdentifier a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 TypeIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 TypeIdentifier :: k -> Type #

Methods

from1 :: forall (a :: k). TypeIdentifier a -> Rep1 TypeIdentifier a #

to1 :: forall (a :: k). Rep1 TypeIdentifier a -> TypeIdentifier a #

type Rep (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousType = Token "type" 12 Source #

type AnonymousTry = Token "try" 30 Source #

data True a Source #

Constructors

True 

Fields

Instances

Instances details
Functor True Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable True Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> True a -> 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.TSX.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.TSX.AST

Methods

symbolMatch :: Proxy True -> Node -> Bool

showFailure :: Proxy True -> Node -> String

Unmarshal True Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (True a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.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.TSX.AST

Methods

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

show :: True a -> String #

showList :: [True a] -> ShowS #

Generic (True a) Source # 
Instance details

Defined in TreeSitter.TSX.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.TSX.AST

Associated Types

type Rep1 True :: k -> Type #

Methods

from1 :: forall (a :: k). True a -> Rep1 True a #

to1 :: forall (a :: k). Rep1 True a -> True a #

type Rep (True a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousThrow = Token "throw" 36 Source #

data This a Source #

Constructors

This 

Fields

Instances

Instances details
Functor This Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable This Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> This a -> 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.TSX.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.TSX.AST

Methods

symbolMatch :: Proxy This -> Node -> Bool

showFailure :: Proxy This -> Node -> String

Unmarshal This Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (This a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.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.TSX.AST

Methods

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

show :: This a -> String #

showList :: [This a] -> ShowS #

Generic (This a) Source # 
Instance details

Defined in TreeSitter.TSX.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.TSX.AST

Associated Types

type Rep1 This :: k -> Type #

Methods

from1 :: forall (a :: k). This a -> Rep1 This a #

to1 :: forall (a :: k). Rep1 This a -> This a #

type Rep (This a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousTarget = Token "target" 107 Source #

type AnonymousSymbol = Token "symbol" 128 Source #

type AnonymousSwitch = Token "switch" 21 Source #

data Super a Source #

Constructors

Super 

Fields

Instances

Instances details
Functor Super Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable Super Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> Super a -> 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.TSX.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.TSX.AST

Methods

symbolMatch :: Proxy Super -> Node -> Bool

showFailure :: Proxy Super -> Node -> String

Unmarshal Super Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Super a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.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.TSX.AST

Methods

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

show :: Super a -> String #

showList :: [Super a] -> ShowS #

Generic (Super a) Source # 
Instance details

Defined in TreeSitter.TSX.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.TSX.AST

Associated Types

type Rep1 Super :: k -> Type #

Methods

from1 :: forall (a :: k). Super a -> Rep1 Super a #

to1 :: forall (a :: k). Rep1 Super a -> Super a #

type Rep (Super a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousString = Token "string" 127 Source #

type AnonymousStatic = Token "static" 115 Source #

data StatementIdentifier a Source #

Constructors

StatementIdentifier 

Fields

Instances

Instances details
Functor StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Foldable StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> StatementIdentifier a -> m #

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

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

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

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

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

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

toList :: StatementIdentifier a -> [a] #

null :: StatementIdentifier a -> Bool #

length :: StatementIdentifier a -> Int #

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

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

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

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

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

Traversable StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

SymbolMatching StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (StatementIdentifier a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (StatementIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 StatementIdentifier :: k -> Type #

Methods

from1 :: forall (a :: k). StatementIdentifier a -> Rep1 StatementIdentifier a #

to1 :: forall (a :: k). Rep1 StatementIdentifier a -> StatementIdentifier a #

type Rep (StatementIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data ShorthandPropertyIdentifier a Source #

Constructors

ShorthandPropertyIdentifier 

Fields

Instances

Instances details
Functor ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Foldable ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Traversable ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

SymbolMatching ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ShorthandPropertyIdentifier a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (ShorthandPropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 ShorthandPropertyIdentifier :: k -> Type #

type Rep (ShorthandPropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousSet = Token "set" 118 Source #

type AnonymousReturn = Token "return" 35 Source #

type AnonymousRequire = Token "require" 129 Source #

data RegexPattern a Source #

Constructors

RegexPattern 

Fields

Instances

Instances details
Functor RegexPattern Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable RegexPattern Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> RegexPattern a -> m #

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

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

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

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

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

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

toList :: RegexPattern a -> [a] #

null :: RegexPattern a -> Bool #

length :: RegexPattern a -> Int #

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

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

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

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

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

Traversable RegexPattern Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching RegexPattern Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal RegexPattern Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (RegexPattern a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (RegexPattern a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 RegexPattern Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 RegexPattern :: k -> Type #

Methods

from1 :: forall (a :: k). RegexPattern a -> Rep1 RegexPattern a #

to1 :: forall (a :: k). Rep1 RegexPattern a -> RegexPattern a #

type Rep (RegexPattern a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data RegexFlags a Source #

Constructors

RegexFlags 

Fields

Instances

Instances details
Functor RegexFlags Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable RegexFlags Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> RegexFlags a -> m #

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

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

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

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

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

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

toList :: RegexFlags a -> [a] #

null :: RegexFlags a -> Bool #

length :: RegexFlags a -> Int #

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

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

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

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

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

Traversable RegexFlags Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching RegexFlags Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal RegexFlags Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (RegexFlags a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (RegexFlags a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 RegexFlags Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 RegexFlags :: k -> Type #

Methods

from1 :: forall (a :: k). RegexFlags a -> Rep1 RegexFlags a #

to1 :: forall (a :: k). Rep1 RegexFlags a -> RegexFlags a #

type Rep (RegexFlags a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data Readonly a Source #

Constructors

Readonly 

Fields

Instances

Instances details
Functor Readonly Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable Readonly Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> Readonly a -> m #

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

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

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

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

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

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

toList :: Readonly a -> [a] #

null :: Readonly a -> Bool #

length :: Readonly a -> Int #

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

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

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

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

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

Traversable Readonly Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching Readonly Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy Readonly -> Node -> Bool

showFailure :: Proxy Readonly -> Node -> String

Unmarshal Readonly Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Readonly a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

Methods

compare :: Readonly a -> Readonly a -> Ordering #

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

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

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

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

max :: Readonly a -> Readonly a -> Readonly a #

min :: Readonly a -> Readonly a -> Readonly a #

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

Defined in TreeSitter.TSX.AST

Methods

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

show :: Readonly a -> String #

showList :: [Readonly a] -> ShowS #

Generic (Readonly a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 Readonly Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 Readonly :: k -> Type #

Methods

from1 :: forall (a :: k). Readonly a -> Rep1 Readonly a #

to1 :: forall (a :: k). Rep1 Readonly a -> Readonly a #

type Rep (Readonly a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousPublic = Token "public" 120 Source #

type AnonymousProtected = Token "protected" 122 Source #

data PropertyIdentifier a Source #

Constructors

PropertyIdentifier 

Fields

Instances

Instances details
Functor PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Foldable PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> PropertyIdentifier a -> m #

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

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

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

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

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

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

toList :: PropertyIdentifier a -> [a] #

null :: PropertyIdentifier a -> Bool #

length :: PropertyIdentifier a -> Int #

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

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

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

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

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

Traversable PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

SymbolMatching PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (PropertyIdentifier a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (PropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 PropertyIdentifier :: k -> Type #

Methods

from1 :: forall (a :: k). PropertyIdentifier a -> Rep1 PropertyIdentifier a #

to1 :: forall (a :: k). Rep1 PropertyIdentifier a -> PropertyIdentifier a #

type Rep (PropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousPrivate = Token "private" 121 Source #

type AnonymousOf = Token "of" 27 Source #

type AnonymousNumber = Token "number" 125 Source #

data Number a Source #

Constructors

Number 

Fields

Instances

Instances details
Functor Number Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable Number Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> Number a -> m #

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

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

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

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

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

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

toList :: Number a -> [a] #

null :: Number a -> Bool #

length :: Number a -> Int #

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

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

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

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

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

Traversable Number Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching Number Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy Number -> Node -> Bool

showFailure :: Proxy Number -> Node -> String

Unmarshal Number Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Number a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

Methods

compare :: Number a -> Number a -> Ordering #

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

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

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

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

max :: Number a -> Number a -> Number a #

min :: Number a -> Number a -> Number a #

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

Defined in TreeSitter.TSX.AST

Methods

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

show :: Number a -> String #

showList :: [Number a] -> ShowS #

Generic (Number a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 Number Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 Number :: k -> Type #

Methods

from1 :: forall (a :: k). Number a -> Rep1 Number a #

to1 :: forall (a :: k). Rep1 Number a -> Number a #

type Rep (Number a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data Null a Source #

Constructors

Null 

Fields

Instances

Instances details
Functor Null Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable Null Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> Null a -> m #

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

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

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

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

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

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

toList :: Null a -> [a] #

null :: Null a -> Bool #

length :: Null a -> Int #

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

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

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

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

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

Traversable Null Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching Null Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy Null -> Node -> Bool

showFailure :: Proxy Null -> Node -> String

Unmarshal Null Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Null a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

Methods

compare :: Null a -> Null a -> Ordering #

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

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

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

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

max :: Null a -> Null a -> Null a #

min :: Null a -> Null a -> Null a #

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

Defined in TreeSitter.TSX.AST

Methods

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

show :: Null a -> String #

showList :: [Null a] -> ShowS #

Generic (Null a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 Null Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 Null :: k -> Type #

Methods

from1 :: forall (a :: k). Null a -> Rep1 Null a #

to1 :: forall (a :: k). Rep1 Null a -> Null a #

type Rep (Null a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousNew = Token "new" 55 Source #

type AnonymousNamespace = Token "namespace" 8 Source #

type AnonymousModule = Token "module" 123 Source #

type AnonymousLet = Token "let" 17 Source #

type AnonymousKeyof = Token "keyof" 137 Source #

data JsxText a Source #

Constructors

JsxText 

Fields

Instances

Instances details
Functor JsxText Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable JsxText Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> JsxText a -> m #

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

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

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

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

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

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

toList :: JsxText a -> [a] #

null :: JsxText a -> Bool #

length :: JsxText a -> Int #

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

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

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

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

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

Traversable JsxText Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching JsxText Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy JsxText -> Node -> Bool

showFailure :: Proxy JsxText -> Node -> String

Unmarshal JsxText Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (JsxText a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

Methods

compare :: JsxText a -> JsxText a -> Ordering #

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

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

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

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

max :: JsxText a -> JsxText a -> JsxText a #

min :: JsxText a -> JsxText a -> JsxText a #

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

Defined in TreeSitter.TSX.AST

Methods

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

show :: JsxText a -> String #

showList :: [JsxText a] -> ShowS #

Generic (JsxText a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 JsxText Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 JsxText :: k -> Type #

Methods

from1 :: forall (a :: k). JsxText a -> Rep1 JsxText a #

to1 :: forall (a :: k). Rep1 JsxText a -> JsxText a #

type Rep (JsxText a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousIs = Token "is" 136 Source #

type AnonymousInterface = Token "interface" 132 Source #

type AnonymousInstanceof = Token "instanceof" 88 Source #

type AnonymousIn = Token "in" 26 Source #

type AnonymousImport = Token "import" 14 Source #

type AnonymousImplements = Token "implements" 130 Source #

type AnonymousIf = Token "if" 19 Source #

data Identifier a Source #

Constructors

Identifier 

Fields

Instances

Instances details
Functor Identifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable Identifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> Identifier a -> 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.TSX.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.TSX.AST

Unmarshal Identifier Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Identifier a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (Identifier a) Source # 
Instance details

Defined in TreeSitter.TSX.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.TSX.AST

Associated Types

type Rep1 Identifier :: k -> Type #

Methods

from1 :: forall (a :: k). Identifier a -> Rep1 Identifier a #

to1 :: forall (a :: k). Rep1 Identifier a -> Identifier a #

type Rep (Identifier a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data HashBangLine a Source #

Constructors

HashBangLine 

Fields

Instances

Instances details
Functor HashBangLine Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable HashBangLine Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> HashBangLine a -> m #

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

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

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

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

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

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

toList :: HashBangLine a -> [a] #

null :: HashBangLine a -> Bool #

length :: HashBangLine a -> Int #

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

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

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

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

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

Traversable HashBangLine Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching HashBangLine Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal HashBangLine Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (HashBangLine a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (HashBangLine a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 HashBangLine Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 HashBangLine :: k -> Type #

Methods

from1 :: forall (a :: k). HashBangLine a -> Rep1 HashBangLine a #

to1 :: forall (a :: k). Rep1 HashBangLine a -> HashBangLine a #

type Rep (HashBangLine a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousGlobal = Token "global" 131 Source #

type AnonymousGet = Token "get" 117 Source #

type AnonymousFunction = Token "function" 53 Source #

type AnonymousFrom = Token "from" 15 Source #

type AnonymousFor = Token "for" 22 Source #

type AnonymousFinally = Token "finally" 41 Source #

data False a Source #

Constructors

False 

Fields

Instances

Instances details
Functor False Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable False Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> False a -> 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.TSX.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.TSX.AST

Methods

symbolMatch :: Proxy False -> Node -> Bool

showFailure :: Proxy False -> Node -> String

Unmarshal False Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (False a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.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.TSX.AST

Methods

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

show :: False a -> String #

showList :: [False a] -> ShowS #

Generic (False a) Source # 
Instance details

Defined in TreeSitter.TSX.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.TSX.AST

Associated Types

type Rep1 False :: k -> Type #

Methods

from1 :: forall (a :: k). False a -> Rep1 False a #

to1 :: forall (a :: k). Rep1 False a -> False a #

type Rep (False a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousExtends = Token "extends" 133 Source #

type AnonymousExport = Token "export" 3 Source #

data EscapeSequence a Source #

Constructors

EscapeSequence 

Fields

Instances

Instances details
Functor EscapeSequence Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable EscapeSequence Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> EscapeSequence a -> m #

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

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

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

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

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

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

toList :: EscapeSequence a -> [a] #

null :: EscapeSequence a -> Bool #

length :: EscapeSequence a -> Int #

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

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

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

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

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

Traversable EscapeSequence Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching EscapeSequence Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal EscapeSequence Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (EscapeSequence a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (EscapeSequence a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 EscapeSequence Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 EscapeSequence :: k -> Type #

Methods

from1 :: forall (a :: k). EscapeSequence a -> Rep1 EscapeSequence a #

to1 :: forall (a :: k). Rep1 EscapeSequence a -> EscapeSequence a #

type Rep (EscapeSequence a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

type AnonymousEnum = Token "enum" 134 Source #

type AnonymousElse = Token "else" 20 Source #

type AnonymousDo = Token "do" 29 Source #

type AnonymousDelete = Token "delete" 92 Source #

type AnonymousDefault = Token "default" 5 Source #

type AnonymousDeclare = Token "declare" 119 Source #

type AnonymousDebugger = Token "debugger" 34 Source #

type AnonymousContinue = Token "continue" 33 Source #

type AnonymousConst = Token "const" 18 Source #

type AnonymousClass = Token "class" 51 Source #

type AnonymousCatch = Token "catch" 40 Source #

type AnonymousCase = Token "case" 39 Source #

type AnonymousBreak = Token "break" 32 Source #

type AnonymousBoolean = Token "boolean" 126 Source #

type AnonymousAwait = Token "await" 25 Source #

type AnonymousAsync = Token "async" 52 Source #

type AnonymousAs = Token "as" 7 Source #

type AnonymousAny = Token "any" 124 Source #

type AnonymousAbstract = Token "abstract" 116 Source #

type AnonymousBacktick = Token "`" 101 Source #

type AnonymousCaretEqual = Token "^=" 61 Source #

type AnonymousCaret = Token "^" 76 Source #

type AnonymousRBracket = Token "]" 44 Source #

type AnonymousLBracket = Token "[" 43 Source #

type AnonymousAt = Token "@" 114 Source #

type AnonymousQuestion = Token "?" 69 Source #

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

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

type AnonymousRAngleRAngle = Token ">>" 72 Source #

type AnonymousRAngleEqual = Token ">=" 87 Source #

type AnonymousRAngle = Token ">" 46 Source #

type AnonymousEqualRAngle = Token "=>" 54 Source #

type AnonymousEqualEqualEqual = Token "===" 84 Source #

type AnonymousEqualEqual = Token "==" 83 Source #

type AnonymousEqual = Token "=" 6 Source #

type AnonymousLAngleEqual = Token "<=" 82 Source #

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

type AnonymousLAngleLAngle = Token "<<" 74 Source #

type AnonymousLAngle = Token "<" 45 Source #

type AnonymousSemicolon = Token ";" 37 Source #

type AnonymousColon = Token ":" 38 Source #

type AnonymousSlashEqual = Token "/=" 59 Source #

type AnonymousSlash = Token "/" 47 Source #

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

type AnonymousDot = Token "." 50 Source #

type AnonymousMinusEqual = Token "-=" 57 Source #

type AnonymousMinusMinus = Token "--" 94 Source #

type AnonymousMinus = Token "-" 79 Source #

type AnonymousComma = Token "," 10 Source #

type AnonymousPlusEqual = Token "+=" 56 Source #

type AnonymousPlusPlus = Token "++" 93 Source #

type AnonymousPlus = Token "+" 78 Source #

type AnonymousStarEqual = Token "*=" 58 Source #

type AnonymousStarStarEqual = Token "**=" 67 Source #

type AnonymousStarStar = Token "**" 81 Source #

type AnonymousStar = Token "*" 4 Source #

type AnonymousRParen = Token ")" 24 Source #

type AnonymousLParen = Token "(" 23 Source #

type AnonymousSQuote = Token "'" 97 Source #

type AnonymousAmpersandEqual = Token "&=" 62 Source #

type AnonymousAmpersandAmpersand = Token "&&" 70 Source #

type AnonymousAmpersand = Token "&" 75 Source #

type AnonymousPercentEqual = Token "%=" 60 Source #

type AnonymousPercent = Token "%" 80 Source #

type AnonymousDollarLBrace = Token "${" 102 Source #

type AnonymousDQuote = Token "\"" 95 Source #

type AnonymousBangEqualEqual = Token "!==" 86 Source #

type AnonymousBangEqual = Token "!=" 85 Source #

type AnonymousBang = Token "!" 89 Source #

data YieldExpression a Source #

Constructors

YieldExpression 

Fields

Instances

Instances details
Functor YieldExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable YieldExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> YieldExpression a -> m #

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

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

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

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

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

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

toList :: YieldExpression a -> [a] #

null :: YieldExpression a -> Bool #

length :: YieldExpression a -> Int #

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

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

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

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

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

Traversable YieldExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching YieldExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal YieldExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (YieldExpression a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (YieldExpression a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 YieldExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 YieldExpression :: k -> Type #

Methods

from1 :: forall (a :: k). YieldExpression a -> Rep1 YieldExpression a #

to1 :: forall (a :: k). Rep1 YieldExpression a -> YieldExpression a #

type Rep (YieldExpression a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data WithStatement a Source #

Constructors

WithStatement 

Fields

Instances

Instances details
Functor WithStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable WithStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> WithStatement a -> m #

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

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

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

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

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

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

toList :: WithStatement a -> [a] #

null :: WithStatement a -> Bool #

length :: WithStatement a -> Int #

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

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

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

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

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

Traversable WithStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching WithStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal WithStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (WithStatement a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (WithStatement a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 WithStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 WithStatement :: k -> Type #

Methods

from1 :: forall (a :: k). WithStatement a -> Rep1 WithStatement a #

to1 :: forall (a :: k). Rep1 WithStatement a -> WithStatement a #

type Rep (WithStatement a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

type Rep1 WithStatement = D1 ('MetaData "WithStatement" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "WithStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Statement) :*: S1 ('MetaSel ('Just "object") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ParenthesizedExpression))))

data WhileStatement a Source #

Constructors

WhileStatement 

Fields

Instances

Instances details
Functor WhileStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable WhileStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> WhileStatement a -> 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.TSX.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.TSX.AST

Unmarshal WhileStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (WhileStatement a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 WhileStatement Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 WhileStatement :: k -> Type #

Methods

from1 :: forall (a :: k). WhileStatement a -> Rep1 WhileStatement a #

to1 :: forall (a :: k). Rep1 WhileStatement a -> WhileStatement a #

type Rep (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

type Rep1 WhileStatement = D1 ('MetaData "WhileStatement" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "WhileStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Statement) :*: S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ParenthesizedExpression))))

data VariableDeclarator a Source #

Instances

Instances details
Functor VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TSX.AST

Foldable VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> VariableDeclarator a -> 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.TSX.AST

SymbolMatching VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (VariableDeclarator a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 VariableDeclarator :: k -> Type #

Methods

from1 :: forall (a :: k). VariableDeclarator a -> Rep1 VariableDeclarator a #

to1 :: forall (a :: k). Rep1 VariableDeclarator a -> VariableDeclarator a #

type Rep (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep1 VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TSX.AST

data VariableDeclaration a Source #

Instances

Instances details
Functor VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TSX.AST

Foldable VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> VariableDeclaration a -> m #

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

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

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

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

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

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

toList :: VariableDeclaration a -> [a] #

null :: VariableDeclaration a -> Bool #

length :: VariableDeclaration a -> Int #

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

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

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

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

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

Traversable VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TSX.AST

SymbolMatching VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (VariableDeclaration a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (VariableDeclaration a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 VariableDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). VariableDeclaration a -> Rep1 VariableDeclaration a #

to1 :: forall (a :: k). Rep1 VariableDeclaration a -> VariableDeclaration a #

type Rep (VariableDeclaration a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

type Rep1 VariableDeclaration = D1 ('MetaData "VariableDeclaration" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "VariableDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 VariableDeclarator)))

data UpdateExpression a Source #

Instances

Instances details
Functor UpdateExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable UpdateExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> UpdateExpression a -> 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.TSX.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.TSX.AST

Unmarshal UpdateExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (UpdateExpression a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 UpdateExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 UpdateExpression :: k -> Type #

Methods

from1 :: forall (a :: k). UpdateExpression a -> Rep1 UpdateExpression a #

to1 :: forall (a :: k). Rep1 UpdateExpression a -> UpdateExpression a #

type Rep (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep (UpdateExpression a) = D1 ('MetaData "UpdateExpression" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "UpdateExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "operator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((AnonymousPlusPlus :+: AnonymousMinusMinus) a)) :*: S1 ('MetaSel ('Just "argument") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 UpdateExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep1 UpdateExpression = D1 ('MetaData "UpdateExpression" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "UpdateExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "operator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (AnonymousPlusPlus :+: AnonymousMinusMinus)) :*: S1 ('MetaSel ('Just "argument") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data UnionType a Source #

Instances

Instances details
Functor UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> UnionType a -> m #

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

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

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

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

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

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

toList :: UnionType a -> [a] #

null :: UnionType a -> Bool #

length :: UnionType a -> Int #

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

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

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

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

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

Traversable UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy UnionType -> Node -> Bool

showFailure :: Proxy UnionType -> Node -> String

Unmarshal UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (UnionType a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (UnionType a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 UnionType :: k -> Type #

Methods

from1 :: forall (a :: k). UnionType a -> Rep1 UnionType a #

to1 :: forall (a :: k). Rep1 UnionType a -> UnionType a #

type Rep (UnionType a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep1 UnionType Source # 
Instance details

Defined in TreeSitter.TSX.AST

data UnaryExpression a Source #

Instances

Instances details
Functor UnaryExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable UnaryExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> UnaryExpression a -> 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.TSX.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.TSX.AST

Unmarshal UnaryExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (UnaryExpression a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 UnaryExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 UnaryExpression :: k -> Type #

Methods

from1 :: forall (a :: k). UnaryExpression a -> Rep1 UnaryExpression a #

to1 :: forall (a :: k). Rep1 UnaryExpression a -> UnaryExpression a #

type Rep (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep1 UnaryExpression Source # 
Instance details

Defined in TreeSitter.TSX.AST

data TypeQuery a Source #

Constructors

TypeQuery 

Instances

Instances details
Functor TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> TypeQuery a -> m #

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

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

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

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

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

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

toList :: TypeQuery a -> [a] #

null :: TypeQuery a -> Bool #

length :: TypeQuery a -> Int #

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

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

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

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

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

Traversable TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

symbolMatch :: Proxy TypeQuery -> Node -> Bool

showFailure :: Proxy TypeQuery -> Node -> String

Unmarshal TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeQuery a)

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

Defined in TreeSitter.TSX.AST

Methods

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

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

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (TypeQuery a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Methods

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

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

Generic1 TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 TypeQuery :: k -> Type #

Methods

from1 :: forall (a :: k). TypeQuery a -> Rep1 TypeQuery a #

to1 :: forall (a :: k). Rep1 TypeQuery a -> TypeQuery a #

type Rep (TypeQuery a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep (TypeQuery a) = D1 ('MetaData "TypeQuery" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "TypeQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: NestedIdentifier) a))))
type Rep1 TypeQuery Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep1 TypeQuery = D1 ('MetaData "TypeQuery" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "TypeQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Identifier :+: NestedIdentifier))))

data TypePredicate a Source #

Instances

Instances details
Functor TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> TypePredicate a -> m #

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

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

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

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

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

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

toList :: TypePredicate a -> [a] #

null :: TypePredicate a -> Bool #

length :: TypePredicate a -> Int #

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

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

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

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

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

Traversable TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

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

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

SymbolMatching TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

Unmarshal TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypePredicate a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (TypePredicate a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 TypePredicate :: k -> Type #

Methods

from1 :: forall (a :: k). TypePredicate a -> Rep1 TypePredicate a #

to1 :: forall (a :: k). Rep1 TypePredicate a -> TypePredicate a #

type Rep (TypePredicate a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

type Rep1 TypePredicate Source # 
Instance details

Defined in TreeSitter.TSX.AST

data TypeParameters a Source #

Constructors

TypeParameters 

Fields

Instances

Instances details
Functor TypeParameters Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable TypeParameters Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> TypeParameters a -> 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.TSX.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.TSX.AST

Unmarshal TypeParameters Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeParameters a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 TypeParameters Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 TypeParameters :: k -> Type #

Methods

from1 :: forall (a :: k). TypeParameters a -> Rep1 TypeParameters a #

to1 :: forall (a :: k). Rep1 TypeParameters a -> TypeParameters a #

type Rep (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

data TypeParameter a Source #

Instances

Instances details
Functor TypeParameter Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

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

Foldable TypeParameter Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

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

foldMap :: Monoid m => (a -> m) -> TypeParameter a -> 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.TSX.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.TSX.AST

Unmarshal TypeParameter Source # 
Instance details

Defined in TreeSitter.TSX.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (TypeParameter a)

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

Generic (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

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

Generic1 TypeParameter Source # 
Instance details

Defined in TreeSitter.TSX.AST

Associated Types

type Rep1 TypeParameter :: k -> Type #

Methods

from1 :: forall (a :: k). TypeParameter a -> Rep1 TypeParameter a #

to1 :: forall (a :: k). Rep1 TypeParameter a -> TypeParameter a #

type Rep (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.TSX.AST

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

Defined in TreeSitter.TSX.AST

type Rep1 TypeParameter = D1 ('MetaData "TypeParameter" "TreeSitter.TSX.AST" "tree-sitter-tsx-0.4.0.0-inplace" 'False) (C1 ('MetaCons "TypeParameter" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Constraint :+: (DefaultType :+: TypeIdentifier)))))