tree-sitter-typescript-0.4.1.0: Tree-sitter grammar/parser for TypeScript
Safe HaskellNone
LanguageHaskell2010

TreeSitter.TypeScript.AST

Documentation

type AnonymousTilde = Token "~" 88 Source #

type AnonymousRBrace = Token "}" 11 Source #

type AnonymousPipeRBrace = Token "|}" 137 Source #

type AnonymousPipePipe = Token "||" 69 Source #

type AnonymousPipeEqual = Token "|=" 61 Source #

type AnonymousPipe = Token "|" 75 Source #

type AnonymousLBracePipe = Token "{|" 136 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" 89 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.TypeScript.AST

Methods

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

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

Foldable Undefined Source # 
Instance details

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

Unmarshal Undefined Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Undefined)

matchers :: B (Int, Match Undefined)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (Undefined a) Source # 
Instance details

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

type Rep (Undefined a) = D1 ('MetaData "Undefined" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 Undefined = D1 ('MetaData "Undefined" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable TypeIdentifier Source # 
Instance details

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

Unmarshal TypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeIdentifier)

matchers :: B (Int, Match TypeIdentifier)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeIdentifier Source # 
Instance details

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

type Rep (TypeIdentifier a) = D1 ('MetaData "TypeIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 TypeIdentifier = D1 ('MetaData "TypeIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable True Source # 
Instance details

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

Methods

matchedSymbols :: Proxy True -> [Int]

showFailure :: Proxy True -> Node -> String

Unmarshal True Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match True)

matchers :: B (Int, Match True)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: True a -> String #

showList :: [True a] -> ShowS #

Generic (True a) Source # 
Instance details

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

type Rep (True a) = D1 ('MetaData "True" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 True = D1 ('MetaData "True" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable This Source # 
Instance details

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

Methods

matchedSymbols :: Proxy This -> [Int]

showFailure :: Proxy This -> Node -> String

Unmarshal This Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match This)

matchers :: B (Int, Match This)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: This a -> String #

showList :: [This a] -> ShowS #

Generic (This a) Source # 
Instance details

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

type Rep (This a) = D1 ('MetaData "This" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 This = D1 ('MetaData "This" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 105 Source #

type AnonymousSymbol = Token "symbol" 126 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.TypeScript.AST

Methods

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

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

Foldable Super Source # 
Instance details

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

Unmarshal Super Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Super)

matchers :: B (Int, Match Super)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: Super a -> String #

showList :: [Super a] -> ShowS #

Generic (Super a) Source # 
Instance details

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

type Rep (Super a) = D1 ('MetaData "Super" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 Super = D1 ('MetaData "Super" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 125 Source #

type AnonymousStatic = Token "static" 113 Source #

data StatementIdentifier a Source #

Constructors

StatementIdentifier 

Fields

Instances

Instances details
Functor StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable StatementIdentifier Source # 
Instance details

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

SymbolMatching StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal StatementIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (StatementIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 StatementIdentifier Source # 
Instance details

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

type Rep (StatementIdentifier a) = D1 ('MetaData "StatementIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 StatementIdentifier = D1 ('MetaData "StatementIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Foldable ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Traversable ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (ShorthandPropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 ShorthandPropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ShorthandPropertyIdentifier :: k -> Type #

type Rep (ShorthandPropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ShorthandPropertyIdentifier a) = D1 ('MetaData "ShorthandPropertyIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 ShorthandPropertyIdentifier = D1 ('MetaData "ShorthandPropertyIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 116 Source #

type AnonymousReturn = Token "return" 35 Source #

type AnonymousRequire = Token "require" 127 Source #

data RegexPattern a Source #

Constructors

RegexPattern 

Fields

Instances

Instances details
Functor RegexPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable RegexPattern Source # 
Instance details

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

Unmarshal RegexPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match RegexPattern)

matchers :: B (Int, Match RegexPattern)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (RegexPattern a) Source # 
Instance details

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

type Rep (RegexPattern a) = D1 ('MetaData "RegexPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 RegexPattern = D1 ('MetaData "RegexPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable RegexFlags Source # 
Instance details

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

Unmarshal RegexFlags Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match RegexFlags)

matchers :: B (Int, Match RegexFlags)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (RegexFlags a) Source # 
Instance details

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

type Rep (RegexFlags a) = D1 ('MetaData "RegexFlags" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 RegexFlags = D1 ('MetaData "RegexFlags" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable Readonly Source # 
Instance details

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

Unmarshal Readonly Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Readonly)

matchers :: B (Int, Match Readonly)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: Readonly a -> String #

showList :: [Readonly a] -> ShowS #

Generic (Readonly a) Source # 
Instance details

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

type Rep (Readonly a) = D1 ('MetaData "Readonly" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 Readonly = D1 ('MetaData "Readonly" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 118 Source #

type AnonymousProtected = Token "protected" 120 Source #

data PropertyIdentifier a Source #

Constructors

PropertyIdentifier 

Fields

Instances

Instances details
Functor PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable PropertyIdentifier Source # 
Instance details

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

SymbolMatching PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal PropertyIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (PropertyIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 PropertyIdentifier Source # 
Instance details

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

type Rep (PropertyIdentifier a) = D1 ('MetaData "PropertyIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 PropertyIdentifier = D1 ('MetaData "PropertyIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 119 Source #

type AnonymousOf = Token "of" 27 Source #

type AnonymousNumber = Token "number" 123 Source #

data Number a Source #

Constructors

Number 

Fields

Instances

Instances details
Functor Number Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable Number Source # 
Instance details

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

Unmarshal Number Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Number)

matchers :: B (Int, Match Number)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: Number a -> String #

showList :: [Number a] -> ShowS #

Generic (Number a) Source # 
Instance details

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

type Rep (Number a) = D1 ('MetaData "Number" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 Number = D1 ('MetaData "Number" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable Null Source # 
Instance details

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

Methods

matchedSymbols :: Proxy Null -> [Int]

showFailure :: Proxy Null -> Node -> String

Unmarshal Null Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Null)

matchers :: B (Int, Match Null)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: Null a -> String #

showList :: [Null a] -> ShowS #

Generic (Null a) Source # 
Instance details

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

type Rep (Null a) = D1 ('MetaData "Null" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 Null = D1 ('MetaData "Null" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 53 Source #

type AnonymousNamespace = Token "namespace" 8 Source #

type AnonymousModule = Token "module" 121 Source #

type AnonymousLet = Token "let" 17 Source #

type AnonymousKeyof = Token "keyof" 135 Source #

data JsxText a Source #

Constructors

JsxText 

Fields

Instances

Instances details
Functor JsxText Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable JsxText Source # 
Instance details

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

Unmarshal JsxText Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match JsxText)

matchers :: B (Int, Match JsxText)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: JsxText a -> String #

showList :: [JsxText a] -> ShowS #

Generic (JsxText a) Source # 
Instance details

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

type Rep (JsxText a) = D1 ('MetaData "JsxText" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 JsxText = D1 ('MetaData "JsxText" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 134 Source #

type AnonymousInterface = Token "interface" 130 Source #

type AnonymousInstanceof = Token "instanceof" 86 Source #

type AnonymousIn = Token "in" 26 Source #

type AnonymousImport = Token "import" 14 Source #

type AnonymousImplements = Token "implements" 128 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.TypeScript.AST

Methods

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

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

Foldable Identifier Source # 
Instance details

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

Unmarshal Identifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Identifier)

matchers :: B (Int, Match Identifier)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (Identifier a) Source # 
Instance details

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

type Rep (Identifier a) = D1 ('MetaData "Identifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 Identifier = D1 ('MetaData "Identifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable HashBangLine Source # 
Instance details

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

Unmarshal HashBangLine Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match HashBangLine)

matchers :: B (Int, Match HashBangLine)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (HashBangLine a) Source # 
Instance details

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

type Rep (HashBangLine a) = D1 ('MetaData "HashBangLine" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 HashBangLine = D1 ('MetaData "HashBangLine" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 129 Source #

type AnonymousGet = Token "get" 115 Source #

type AnonymousFunction = Token "function" 51 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.TypeScript.AST

Methods

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

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

Foldable False Source # 
Instance details

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

Unmarshal False Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match False)

matchers :: B (Int, Match False)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

Methods

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

show :: False a -> String #

showList :: [False a] -> ShowS #

Generic (False a) Source # 
Instance details

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

type Rep (False a) = D1 ('MetaData "False" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 False = D1 ('MetaData "False" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 131 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.TypeScript.AST

Methods

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

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

Foldable EscapeSequence Source # 
Instance details

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

Unmarshal EscapeSequence Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match EscapeSequence)

matchers :: B (Int, Match EscapeSequence)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (EscapeSequence a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 EscapeSequence Source # 
Instance details

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

type Rep (EscapeSequence a) = D1 ('MetaData "EscapeSequence" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 EscapeSequence = D1 ('MetaData "EscapeSequence" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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" 132 Source #

type AnonymousElse = Token "else" 20 Source #

type AnonymousDo = Token "do" 29 Source #

type AnonymousDelete = Token "delete" 90 Source #

type AnonymousDefault = Token "default" 5 Source #

type AnonymousDeclare = Token "declare" 117 Source #

type AnonymousDebugger = Token "debugger" 34 Source #

type AnonymousContinue = Token "continue" 33 Source #

type AnonymousConst = Token "const" 18 Source #

type AnonymousClass = Token "class" 49 Source #

type AnonymousCatch = Token "catch" 40 Source #

type AnonymousCase = Token "case" 39 Source #

type AnonymousBreak = Token "break" 32 Source #

type AnonymousBoolean = Token "boolean" 124 Source #

type AnonymousAwait = Token "await" 25 Source #

type AnonymousAsync = Token "async" 50 Source #

type AnonymousAs = Token "as" 7 Source #

type AnonymousAny = Token "any" 122 Source #

type AnonymousAbstract = Token "abstract" 114 Source #

type AnonymousBacktick = Token "`" 99 Source #

type AnonymousCaretEqual = Token "^=" 59 Source #

type AnonymousCaret = Token "^" 74 Source #

type AnonymousRBracket = Token "]" 44 Source #

type AnonymousLBracket = Token "[" 43 Source #

type AnonymousAt = Token "@" 112 Source #

type AnonymousQuestion = Token "?" 67 Source #

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

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

type AnonymousRAngleRAngle = Token ">>" 70 Source #

type AnonymousRAngleEqual = Token ">=" 85 Source #

type AnonymousRAngle = Token ">" 46 Source #

type AnonymousEqualRAngle = Token "=>" 52 Source #

type AnonymousEqualEqualEqual = Token "===" 82 Source #

type AnonymousEqualEqual = Token "==" 81 Source #

type AnonymousEqual = Token "=" 6 Source #

type AnonymousLAngleEqual = Token "<=" 80 Source #

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

type AnonymousLAngleLAngle = Token "<<" 72 Source #

type AnonymousLAngle = Token "<" 45 Source #

type AnonymousSemicolon = Token ";" 37 Source #

type AnonymousColon = Token ":" 38 Source #

type AnonymousSlashEqual = Token "/=" 57 Source #

type AnonymousSlash = Token "/" 47 Source #

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

type AnonymousDot = Token "." 48 Source #

type AnonymousMinusEqual = Token "-=" 55 Source #

type AnonymousMinusMinus = Token "--" 92 Source #

type AnonymousMinus = Token "-" 77 Source #

type AnonymousComma = Token "," 10 Source #

type AnonymousPlusEqual = Token "+=" 54 Source #

type AnonymousPlusPlus = Token "++" 91 Source #

type AnonymousPlus = Token "+" 76 Source #

type AnonymousStarEqual = Token "*=" 56 Source #

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

type AnonymousStarStar = Token "**" 79 Source #

type AnonymousStar = Token "*" 4 Source #

type AnonymousRParen = Token ")" 24 Source #

type AnonymousLParen = Token "(" 23 Source #

type AnonymousSQuote = Token "'" 95 Source #

type AnonymousAmpersandEqual = Token "&=" 60 Source #

type AnonymousAmpersandAmpersand = Token "&&" 68 Source #

type AnonymousAmpersand = Token "&" 73 Source #

type AnonymousPercentEqual = Token "%=" 58 Source #

type AnonymousPercent = Token "%" 78 Source #

type AnonymousDollarLBrace = Token "${" 100 Source #

type AnonymousDQuote = Token "\"" 93 Source #

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

type AnonymousBangEqual = Token "!=" 83 Source #

type AnonymousBang = Token "!" 87 Source #

data YieldExpression a Source #

Constructors

YieldExpression 

Fields

Instances

Instances details
Functor YieldExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable YieldExpression Source # 
Instance details

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

Unmarshal YieldExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (YieldExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 YieldExpression Source # 
Instance details

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

type Rep (YieldExpression a) = D1 ('MetaData "YieldExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 YieldExpression = D1 ('MetaData "YieldExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable WithStatement Source # 
Instance details

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

Unmarshal WithStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match WithStatement)

matchers :: B (Int, Match WithStatement)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (WithStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 WithStatement Source # 
Instance details

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

type Rep (WithStatement a) = D1 ('MetaData "WithStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 WithStatement = D1 ('MetaData "WithStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable WhileStatement Source # 
Instance details

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

Unmarshal WhileStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match WhileStatement)

matchers :: B (Int, Match WhileStatement)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (WhileStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 WhileStatement Source # 
Instance details

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

type Rep (WhileStatement a) = D1 ('MetaData "WhileStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 WhileStatement = D1 ('MetaData "WhileStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Foldable VariableDeclarator Source # 
Instance details

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

SymbolMatching VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (VariableDeclarator a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 VariableDeclarator Source # 
Instance details

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

type Rep (VariableDeclarator a) = D1 ('MetaData "VariableDeclarator" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "VariableDeclarator" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Expression a)))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((DestructuringPattern :+: Identifier) a)) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeAnnotation a))))))
type Rep1 VariableDeclarator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data VariableDeclaration a Source #

Instances

Instances details
Functor VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable VariableDeclaration Source # 
Instance details

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

SymbolMatching VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal VariableDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (VariableDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 VariableDeclaration Source # 
Instance details

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

type Rep (VariableDeclaration a) = D1 ('MetaData "VariableDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 VariableDeclaration = D1 ('MetaData "VariableDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable UpdateExpression Source # 
Instance details

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

Unmarshal UpdateExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (UpdateExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 UpdateExpression Source # 
Instance details

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

type Rep (UpdateExpression a) = D1 ('MetaData "UpdateExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 UpdateExpression = D1 ('MetaData "UpdateExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable UnionType Source # 
Instance details

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

Unmarshal UnionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match UnionType)

matchers :: B (Int, Match UnionType)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (UnionType a) Source # 
Instance details

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

type Rep1 UnionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data UnaryExpression a Source #

Instances

Instances details
Functor UnaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable UnaryExpression Source # 
Instance details

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

Unmarshal UnaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 UnaryExpression Source # 
Instance details

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

type Rep (UnaryExpression a) = D1 ('MetaData "UnaryExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "UnaryExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "operator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((AnonymousBang :+: (AnonymousPlus :+: AnonymousMinus)) :+: ((AnonymousDelete :+: AnonymousTypeof) :+: (AnonymousVoid :+: AnonymousTilde))) a)) :*: S1 ('MetaSel ('Just "argument") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 UnaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data TypeQuery a Source #

Constructors

TypeQuery 

Instances

Instances details
Functor TypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TypeQuery Source # 
Instance details

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

Unmarshal TypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeQuery)

matchers :: B (Int, Match TypeQuery)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeQuery a) Source # 
Instance details

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

type Rep (TypeQuery a) = D1 ('MetaData "TypeQuery" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 TypeQuery = D1 ('MetaData "TypeQuery" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable TypePredicate Source # 
Instance details

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

Unmarshal TypePredicate Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypePredicate)

matchers :: B (Int, Match TypePredicate)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypePredicate a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypePredicate Source # 
Instance details

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

type Rep1 TypePredicate Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data TypeParameters a Source #

Constructors

TypeParameters 

Fields

Instances

Instances details
Functor TypeParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TypeParameters Source # 
Instance details

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

Unmarshal TypeParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeParameters)

matchers :: B (Int, Match TypeParameters)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeParameters a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeParameters Source # 
Instance details

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

type Rep (TypeParameters a) = D1 ('MetaData "TypeParameters" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 TypeParameters = D1 ('MetaData "TypeParameters" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

Methods

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

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

Foldable TypeParameter Source # 
Instance details

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

Unmarshal TypeParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeParameter)

matchers :: B (Int, Match TypeParameter)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeParameter Source # 
Instance details

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

type Rep (TypeParameter a) = D1 ('MetaData "TypeParameter" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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.TypeScript.AST

type Rep1 TypeParameter = D1 ('MetaData "TypeParameter" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.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)))))

data TypeAssertion a Source #

Instances

Instances details
Functor TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeAssertion a -> [a] #

null :: TypeAssertion a -> Bool #

length :: TypeAssertion a -> Int #

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

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

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

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

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

Traversable TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeAssertion)

matchers :: B (Int, Match TypeAssertion)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeAssertion a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TypeAssertion :: k -> Type #

Methods

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

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

type Rep (TypeAssertion a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (TypeAssertion a) = D1 ('MetaData "TypeAssertion" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TypeAssertion" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Expression :+: TypeArguments) a)))))
type Rep1 TypeAssertion Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TypeAssertion = D1 ('MetaData "TypeAssertion" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TypeAssertion" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: TypeArguments))))

data TypeArguments a Source #

Instances

Instances details
Functor TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeArguments a -> [a] #

null :: TypeArguments a -> Bool #

length :: TypeArguments a -> Int #

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

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

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

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

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

Traversable TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeArguments)

matchers :: B (Int, Match TypeArguments)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TypeArguments :: k -> Type #

Methods

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

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

type Rep (TypeArguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TypeArguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data TypeAnnotation a Source #

Instances

Instances details
Functor TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeAnnotation a -> [a] #

null :: TypeAnnotation a -> Bool #

length :: TypeAnnotation a -> Int #

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

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

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

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

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

Traversable TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TypeAnnotation)

matchers :: B (Int, Match TypeAnnotation)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeAnnotation a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TypeAnnotation :: k -> Type #

Methods

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

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

type Rep (TypeAnnotation a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TypeAnnotation Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data TypeAliasDeclaration a Source #

Instances

Instances details
Functor TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeAliasDeclaration a -> [a] #

null :: TypeAliasDeclaration a -> Bool #

length :: TypeAliasDeclaration a -> Int #

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

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

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

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

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

Traversable TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TypeAliasDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TypeAliasDeclaration :: k -> Type #

Methods

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

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

type Rep (TypeAliasDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TypeAliasDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data TupleType a Source #

Instances

Instances details
Functor TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TupleType a -> [a] #

null :: TupleType a -> Bool #

length :: TupleType a -> Int #

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

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

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

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

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

Traversable TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TupleType)

matchers :: B (Int, Match TupleType)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TupleType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Methods

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

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

Generic1 TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TupleType :: k -> Type #

Methods

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

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

type Rep (TupleType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TupleType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data TryStatement a Source #

Constructors

TryStatement 

Fields

Instances

Instances details
Functor TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TryStatement a -> [a] #

null :: TryStatement a -> Bool #

length :: TryStatement a -> Int #

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

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

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

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

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

Traversable TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TryStatement)

matchers :: B (Int, Match TryStatement)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TryStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Methods

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

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

Generic1 TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TryStatement :: k -> Type #

Methods

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

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

type Rep (TryStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (TryStatement a) = D1 ('MetaData "TryStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TryStatement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (StatementBlock a))) :*: (S1 ('MetaSel ('Just "handler") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (CatchClause a))) :*: S1 ('MetaSel ('Just "finalizer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (FinallyClause a))))))
type Rep1 TryStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ThrowStatement a Source #

Instances

Instances details
Functor ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: ThrowStatement a -> [a] #

null :: ThrowStatement a -> Bool #

length :: ThrowStatement a -> Int #

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

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

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

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

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

Traversable ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ThrowStatement)

matchers :: B (Int, Match ThrowStatement)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ThrowStatement :: k -> Type #

Methods

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

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

type Rep (ThrowStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ThrowStatement a) = D1 ('MetaData "ThrowStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ThrowStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: SequenceExpression) a))))
type Rep1 ThrowStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ThrowStatement = D1 ('MetaData "ThrowStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ThrowStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: SequenceExpression))))

data TernaryExpression a Source #

Constructors

TernaryExpression 

Fields

Instances

Instances details
Functor TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TernaryExpression a -> [a] #

null :: TernaryExpression a -> Bool #

length :: TernaryExpression a -> Int #

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

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

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

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

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

Traversable TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TernaryExpression :: k -> Type #

Methods

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

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

type Rep (TernaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (TernaryExpression a) = D1 ('MetaData "TernaryExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TernaryExpression" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "alternative") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))) :*: (S1 ('MetaSel ('Just "consequence") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 TernaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TernaryExpression = D1 ('MetaData "TernaryExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TernaryExpression" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "alternative") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)) :*: (S1 ('MetaSel ('Just "consequence") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data TemplateSubstitution a Source #

Instances

Instances details
Functor TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TemplateSubstitution a -> [a] #

null :: TemplateSubstitution a -> Bool #

length :: TemplateSubstitution a -> Int #

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

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

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

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

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

Traversable TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TemplateSubstitution a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TemplateSubstitution :: k -> Type #

Methods

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

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

type Rep (TemplateSubstitution a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (TemplateSubstitution a) = D1 ('MetaData "TemplateSubstitution" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TemplateSubstitution" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: SequenceExpression) a))))
type Rep1 TemplateSubstitution Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TemplateSubstitution = D1 ('MetaData "TemplateSubstitution" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TemplateSubstitution" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: SequenceExpression))))

data TemplateString a Source #

Instances

Instances details
Functor TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TemplateString a -> [a] #

null :: TemplateString a -> Bool #

length :: TemplateString a -> Int #

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

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

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

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

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

Traversable TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match TemplateString)

matchers :: B (Int, Match TemplateString)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (TemplateString a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 TemplateString :: k -> Type #

Methods

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

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

type Rep (TemplateString a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (TemplateString a) = D1 ('MetaData "TemplateString" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TemplateString" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(EscapeSequence :+: TemplateSubstitution) a])))
type Rep1 TemplateString Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 TemplateString = D1 ('MetaData "TemplateString" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "TemplateString" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (EscapeSequence :+: TemplateSubstitution))))

data SwitchStatement a Source #

Constructors

SwitchStatement 

Fields

Instances

Instances details
Functor SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SwitchStatement a -> [a] #

null :: SwitchStatement a -> Bool #

length :: SwitchStatement a -> Int #

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

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

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

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

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

Traversable SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SwitchStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SwitchStatement :: k -> Type #

Methods

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

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

type Rep (SwitchStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (SwitchStatement a) = D1 ('MetaData "SwitchStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SwitchBody a)) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ParenthesizedExpression a)))))
type Rep1 SwitchStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 SwitchStatement = D1 ('MetaData "SwitchStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 SwitchBody) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ParenthesizedExpression))))

data SwitchDefault a Source #

Constructors

SwitchDefault 

Fields

Instances

Instances details
Functor SwitchDefault Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable SwitchDefault Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SwitchDefault a -> [a] #

null :: SwitchDefault a -> Bool #

length :: SwitchDefault a -> Int #

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

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

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

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

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

Traversable SwitchDefault Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching SwitchDefault Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SwitchDefault Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match SwitchDefault)

matchers :: B (Int, Match SwitchDefault)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SwitchDefault a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 SwitchDefault Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SwitchDefault :: k -> Type #

Methods

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

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

type Rep (SwitchDefault a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

type Rep1 SwitchDefault = D1 ('MetaData "SwitchDefault" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchDefault" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement)))

data SwitchCase a Source #

Constructors

SwitchCase 

Instances

Instances details
Functor SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SwitchCase a -> [a] #

null :: SwitchCase a -> Bool #

length :: SwitchCase a -> Int #

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

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

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

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

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

Traversable SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match SwitchCase)

matchers :: B (Int, Match SwitchCase)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SwitchCase a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Methods

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

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

Generic1 SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SwitchCase :: k -> Type #

Methods

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

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

type Rep (SwitchCase a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (SwitchCase a) = D1 ('MetaData "SwitchCase" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: SequenceExpression) a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Statement a]))))
type Rep1 SwitchCase Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 SwitchCase = D1 ('MetaData "SwitchCase" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: SequenceExpression)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement))))

data SwitchBody a Source #

Constructors

SwitchBody 

Fields

Instances

Instances details
Functor SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SwitchBody a -> [a] #

null :: SwitchBody a -> Bool #

length :: SwitchBody a -> Int #

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

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

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

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

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

Traversable SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match SwitchBody)

matchers :: B (Int, Match SwitchBody)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SwitchBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Methods

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

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

Generic1 SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SwitchBody :: k -> Type #

Methods

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

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

type Rep (SwitchBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (SwitchBody a) = D1 ('MetaData "SwitchBody" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SwitchCase :+: SwitchDefault) a])))
type Rep1 SwitchBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 SwitchBody = D1 ('MetaData "SwitchBody" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SwitchBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (SwitchCase :+: SwitchDefault))))

data SubscriptExpression a Source #

Instances

Instances details
Functor SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SubscriptExpression a -> [a] #

null :: SubscriptExpression a -> Bool #

length :: SubscriptExpression a -> Int #

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

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

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

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

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

Traversable SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SubscriptExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SubscriptExpression :: k -> Type #

Methods

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

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

type Rep (SubscriptExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (SubscriptExpression a) = D1 ('MetaData "SubscriptExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SubscriptExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "object") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "index") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: SequenceExpression) a)))))
type Rep1 SubscriptExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 SubscriptExpression = D1 ('MetaData "SubscriptExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SubscriptExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "object") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "index") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: SequenceExpression)))))

data String a Source #

Constructors

String 

Fields

Instances

Instances details
Functor String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: String a -> [a] #

null :: String a -> Bool #

length :: String a -> Int #

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

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

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

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

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

Traversable String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match String)

matchers :: B (Int, Match String)

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

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

Defined in TreeSitter.TypeScript.AST

Methods

compare :: String a -> String a -> Ordering #

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

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

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

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

max :: String a -> String a -> String a #

min :: String a -> String a -> String a #

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

Defined in TreeSitter.TypeScript.AST

Methods

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

show :: String a -> String0 #

showList :: [String a] -> ShowS #

Generic (String a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Methods

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

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

Generic1 String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 String :: k -> Type #

Methods

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

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

type Rep (String a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (String a) = D1 ('MetaData "String" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "String" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [EscapeSequence a])))
type Rep1 String Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 String = D1 ('MetaData "String" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "String" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 EscapeSequence)))

data StatementBlock a Source #

Constructors

StatementBlock 

Fields

Instances

Instances details
Functor StatementBlock Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable StatementBlock Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: StatementBlock a -> [a] #

null :: StatementBlock a -> Bool #

length :: StatementBlock a -> Int #

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

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

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

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

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

Traversable StatementBlock Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching StatementBlock Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal StatementBlock Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match StatementBlock)

matchers :: B (Int, Match StatementBlock)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (StatementBlock a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 StatementBlock Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 StatementBlock :: k -> Type #

Methods

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

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

type Rep (StatementBlock a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

type Rep1 StatementBlock = D1 ('MetaData "StatementBlock" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "StatementBlock" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement)))

data SpreadElement a Source #

Constructors

SpreadElement 

Fields

Instances

Instances details
Functor SpreadElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable SpreadElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SpreadElement a -> [a] #

null :: SpreadElement a -> Bool #

length :: SpreadElement a -> Int #

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

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

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

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

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

Traversable SpreadElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching SpreadElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SpreadElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match SpreadElement)

matchers :: B (Int, Match SpreadElement)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SpreadElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 SpreadElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SpreadElement :: k -> Type #

Methods

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

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

type Rep (SpreadElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

type Rep1 SpreadElement = D1 ('MetaData "SpreadElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SpreadElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data SequenceExpression a Source #

Constructors

SequenceExpression 

Instances

Instances details
Functor SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SequenceExpression a -> [a] #

null :: SequenceExpression a -> Bool #

length :: SequenceExpression a -> Int #

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

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

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

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

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

Traversable SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (SequenceExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 SequenceExpression :: k -> Type #

Methods

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

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

type Rep (SequenceExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (SequenceExpression a) = D1 ('MetaData "SequenceExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SequenceExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: SequenceExpression) a)))))
type Rep1 SequenceExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 SequenceExpression = D1 ('MetaData "SequenceExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "SequenceExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: SequenceExpression)))))

data ReturnStatement a Source #

Instances

Instances details
Functor ReturnStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable ReturnStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: ReturnStatement a -> [a] #

null :: ReturnStatement a -> Bool #

length :: ReturnStatement a -> Int #

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

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

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

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

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

Traversable ReturnStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching ReturnStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ReturnStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 ReturnStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ReturnStatement :: k -> Type #

Methods

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

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

type Rep (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

type Rep1 ReturnStatement = D1 ('MetaData "ReturnStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ReturnStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 (Expression :+: SequenceExpression))))

data RestParameter a Source #

Instances

Instances details
Functor RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

Foldable RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: RestParameter a -> [a] #

null :: RestParameter a -> Bool #

length :: RestParameter a -> Int #

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

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

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

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

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

Traversable RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

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

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

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

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

SymbolMatching RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match RestParameter)

matchers :: B (Int, Match RestParameter)

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

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

Defined in TreeSitter.TypeScript.AST

Generic (RestParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

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

Generic1 RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 RestParameter :: k -> Type #

Methods

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

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

type Rep (RestParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (RestParameter a) = D1 ('MetaData "RestParameter" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "RestParameter" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Identifier :+: TypeAnnotation) a)))))
type Rep1 RestParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 RestParameter = D1 ('MetaData "RestParameter" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "RestParameter" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Identifier :+: TypeAnnotation))))

data RequiredParameter a Source #

Instances

Instances details
Functor RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => RequiredParameter m -> m #

foldMap :: Monoid m => (a -> m) -> RequiredParameter a -> m #

foldMap' :: Monoid m => (a -> m) -> RequiredParameter a -> m #

foldr :: (a -> b -> b) -> b -> RequiredParameter a -> b #

foldr' :: (a -> b -> b) -> b -> RequiredParameter a -> b #

foldl :: (b -> a -> b) -> b -> RequiredParameter a -> b #

foldl' :: (b -> a -> b) -> b -> RequiredParameter a -> b #

foldr1 :: (a -> a -> a) -> RequiredParameter a -> a #

foldl1 :: (a -> a -> a) -> RequiredParameter a -> a #

toList :: RequiredParameter a -> [a] #

null :: RequiredParameter a -> Bool #

length :: RequiredParameter a -> Int #

elem :: Eq a => a -> RequiredParameter a -> Bool #

maximum :: Ord a => RequiredParameter a -> a #

minimum :: Ord a => RequiredParameter a -> a #

sum :: Num a => RequiredParameter a -> a #

product :: Num a => RequiredParameter a -> a #

Traversable RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> RequiredParameter a -> f (RequiredParameter b) #

sequenceA :: Applicative f => RequiredParameter (f a) -> f (RequiredParameter a) #

mapM :: Monad m => (a -> m b) -> RequiredParameter a -> m (RequiredParameter b) #

sequence :: Monad m => RequiredParameter (m a) -> m (RequiredParameter a) #

SymbolMatching RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (RequiredParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (RequiredParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (RequiredParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (RequiredParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (RequiredParameter a) :: Type -> Type #

Generic1 RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 RequiredParameter :: k -> Type #

Methods

from1 :: forall (a :: k). RequiredParameter a -> Rep1 RequiredParameter a #

to1 :: forall (a :: k). Rep1 RequiredParameter a -> RequiredParameter a #

type Rep (RequiredParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (RequiredParameter a) = D1 ('MetaData "RequiredParameter" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "RequiredParameter" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Expression a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (((DestructuringPattern :+: (AccessibilityModifier :+: Identifier)) :+: (Readonly :+: (This :+: TypeAnnotation))) a))))))
type Rep1 RequiredParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data Regex a Source #

Constructors

Regex 

Fields

Instances

Instances details
Functor Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Regex a -> Regex b #

(<$) :: a -> Regex b -> Regex a #

Foldable Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Regex m -> m #

foldMap :: Monoid m => (a -> m) -> Regex a -> m #

foldMap' :: Monoid m => (a -> m) -> Regex a -> m #

foldr :: (a -> b -> b) -> b -> Regex a -> b #

foldr' :: (a -> b -> b) -> b -> Regex a -> b #

foldl :: (b -> a -> b) -> b -> Regex a -> b #

foldl' :: (b -> a -> b) -> b -> Regex a -> b #

foldr1 :: (a -> a -> a) -> Regex a -> a #

foldl1 :: (a -> a -> a) -> Regex a -> a #

toList :: Regex a -> [a] #

null :: Regex a -> Bool #

length :: Regex a -> Int #

elem :: Eq a => a -> Regex a -> Bool #

maximum :: Ord a => Regex a -> a #

minimum :: Ord a => Regex a -> a #

sum :: Num a => Regex a -> a #

product :: Num a => Regex a -> a #

Traversable Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Regex a -> f (Regex b) #

sequenceA :: Applicative f => Regex (f a) -> f (Regex a) #

mapM :: Monad m => (a -> m b) -> Regex a -> m (Regex b) #

sequence :: Monad m => Regex (m a) -> m (Regex a) #

SymbolMatching Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Regex)

matchers :: B (Int, Match Regex)

Eq a => Eq (Regex a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Regex a -> Regex a -> Bool #

(/=) :: Regex a -> Regex a -> Bool #

Ord a => Ord (Regex a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Regex a -> Regex a -> Ordering #

(<) :: Regex a -> Regex a -> Bool #

(<=) :: Regex a -> Regex a -> Bool #

(>) :: Regex a -> Regex a -> Bool #

(>=) :: Regex a -> Regex a -> Bool #

max :: Regex a -> Regex a -> Regex a #

min :: Regex a -> Regex a -> Regex a #

Show a => Show (Regex a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Regex a -> ShowS #

show :: Regex a -> String #

showList :: [Regex a] -> ShowS #

Generic (Regex a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Regex a) :: Type -> Type #

Methods

from :: Regex a -> Rep (Regex a) x #

to :: Rep (Regex a) x -> Regex a #

Generic1 Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Regex :: k -> Type #

Methods

from1 :: forall (a :: k). Regex a -> Rep1 Regex a #

to1 :: forall (a :: k). Rep1 Regex a -> Regex a #

type Rep (Regex a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Regex a) = D1 ('MetaData "Regex" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Regex" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "flags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (RegexFlags a))) :*: S1 ('MetaSel ('Just "pattern") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (RegexPattern a)))))
type Rep1 Regex Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Regex = D1 ('MetaData "Regex" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Regex" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "flags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 RegexFlags) :*: S1 ('MetaSel ('Just "pattern") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 RegexPattern))))

data PublicFieldDefinition a Source #

Instances

Instances details
Functor PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => PublicFieldDefinition m -> m #

foldMap :: Monoid m => (a -> m) -> PublicFieldDefinition a -> m #

foldMap' :: Monoid m => (a -> m) -> PublicFieldDefinition a -> m #

foldr :: (a -> b -> b) -> b -> PublicFieldDefinition a -> b #

foldr' :: (a -> b -> b) -> b -> PublicFieldDefinition a -> b #

foldl :: (b -> a -> b) -> b -> PublicFieldDefinition a -> b #

foldl' :: (b -> a -> b) -> b -> PublicFieldDefinition a -> b #

foldr1 :: (a -> a -> a) -> PublicFieldDefinition a -> a #

foldl1 :: (a -> a -> a) -> PublicFieldDefinition a -> a #

toList :: PublicFieldDefinition a -> [a] #

null :: PublicFieldDefinition a -> Bool #

length :: PublicFieldDefinition a -> Int #

elem :: Eq a => a -> PublicFieldDefinition a -> Bool #

maximum :: Ord a => PublicFieldDefinition a -> a #

minimum :: Ord a => PublicFieldDefinition a -> a #

sum :: Num a => PublicFieldDefinition a -> a #

product :: Num a => PublicFieldDefinition a -> a #

Traversable PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (PublicFieldDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (PublicFieldDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (PublicFieldDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (PublicFieldDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (PublicFieldDefinition a) :: Type -> Type #

Generic1 PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 PublicFieldDefinition :: k -> Type #

Methods

from1 :: forall (a :: k). PublicFieldDefinition a -> Rep1 PublicFieldDefinition a #

to1 :: forall (a :: k). Rep1 PublicFieldDefinition a -> PublicFieldDefinition a #

type Rep (PublicFieldDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 PublicFieldDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data PropertySignature a Source #

Instances

Instances details
Functor PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => PropertySignature m -> m #

foldMap :: Monoid m => (a -> m) -> PropertySignature a -> m #

foldMap' :: Monoid m => (a -> m) -> PropertySignature a -> m #

foldr :: (a -> b -> b) -> b -> PropertySignature a -> b #

foldr' :: (a -> b -> b) -> b -> PropertySignature a -> b #

foldl :: (b -> a -> b) -> b -> PropertySignature a -> b #

foldl' :: (b -> a -> b) -> b -> PropertySignature a -> b #

foldr1 :: (a -> a -> a) -> PropertySignature a -> a #

foldl1 :: (a -> a -> a) -> PropertySignature a -> a #

toList :: PropertySignature a -> [a] #

null :: PropertySignature a -> Bool #

length :: PropertySignature a -> Int #

elem :: Eq a => a -> PropertySignature a -> Bool #

maximum :: Ord a => PropertySignature a -> a #

minimum :: Ord a => PropertySignature a -> a #

sum :: Num a => PropertySignature a -> a #

product :: Num a => PropertySignature a -> a #

Traversable PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> PropertySignature a -> f (PropertySignature b) #

sequenceA :: Applicative f => PropertySignature (f a) -> f (PropertySignature a) #

mapM :: Monad m => (a -> m b) -> PropertySignature a -> m (PropertySignature b) #

sequence :: Monad m => PropertySignature (m a) -> m (PropertySignature a) #

SymbolMatching PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (PropertySignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (PropertySignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (PropertySignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (PropertySignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (PropertySignature a) :: Type -> Type #

Generic1 PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 PropertySignature :: k -> Type #

Methods

from1 :: forall (a :: k). PropertySignature a -> Rep1 PropertySignature a #

to1 :: forall (a :: k). Rep1 PropertySignature a -> PropertySignature a #

type Rep (PropertySignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (PropertySignature a) = D1 ('MetaData "PropertySignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "PropertySignature" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((ComputedPropertyName :+: Number) :+: (PropertyIdentifier :+: String)) a))) :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeAnnotation a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(AccessibilityModifier :+: Readonly) a]))))
type Rep1 PropertySignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data Program a Source #

Constructors

Program 

Fields

Instances

Instances details
Functor Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Program a -> Program b #

(<$) :: a -> Program b -> Program a #

Foldable Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Program m -> m #

foldMap :: Monoid m => (a -> m) -> Program a -> m #

foldMap' :: Monoid m => (a -> m) -> Program a -> m #

foldr :: (a -> b -> b) -> b -> Program a -> b #

foldr' :: (a -> b -> b) -> b -> Program a -> b #

foldl :: (b -> a -> b) -> b -> Program a -> b #

foldl' :: (b -> a -> b) -> b -> Program a -> b #

foldr1 :: (a -> a -> a) -> Program a -> a #

foldl1 :: (a -> a -> a) -> Program a -> a #

toList :: Program a -> [a] #

null :: Program a -> Bool #

length :: Program a -> Int #

elem :: Eq a => a -> Program a -> Bool #

maximum :: Ord a => Program a -> a #

minimum :: Ord a => Program a -> a #

sum :: Num a => Program a -> a #

product :: Num a => Program a -> a #

Traversable Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Program a -> f (Program b) #

sequenceA :: Applicative f => Program (f a) -> f (Program a) #

mapM :: Monad m => (a -> m b) -> Program a -> m (Program b) #

sequence :: Monad m => Program (m a) -> m (Program a) #

SymbolMatching Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Program)

matchers :: B (Int, Match Program)

Eq a => Eq (Program a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Program a -> Program a -> Bool #

(/=) :: Program a -> Program a -> Bool #

Ord a => Ord (Program a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Program a -> Program a -> Ordering #

(<) :: Program a -> Program a -> Bool #

(<=) :: Program a -> Program a -> Bool #

(>) :: Program a -> Program a -> Bool #

(>=) :: Program a -> Program a -> Bool #

max :: Program a -> Program a -> Program a #

min :: Program a -> Program a -> Program a #

Show a => Show (Program a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Program a -> ShowS #

show :: Program a -> String #

showList :: [Program a] -> ShowS #

Generic (Program a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Program a) :: Type -> Type #

Methods

from :: Program a -> Rep (Program a) x #

to :: Rep (Program a) x -> Program a #

Generic1 Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Program :: k -> Type #

Methods

from1 :: forall (a :: k). Program a -> Rep1 Program a #

to1 :: forall (a :: k). Rep1 Program a -> Program a #

type Rep (Program a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Program a) = D1 ('MetaData "Program" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Program" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Statement :+: HashBangLine) a])))
type Rep1 Program Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Program = D1 ('MetaData "Program" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Program" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (Statement :+: HashBangLine))))

data PredefinedType a Source #

Constructors

PredefinedType 

Fields

Instances

Instances details
Functor PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> PredefinedType a -> PredefinedType b #

(<$) :: a -> PredefinedType b -> PredefinedType a #

Foldable PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => PredefinedType m -> m #

foldMap :: Monoid m => (a -> m) -> PredefinedType a -> m #

foldMap' :: Monoid m => (a -> m) -> PredefinedType a -> m #

foldr :: (a -> b -> b) -> b -> PredefinedType a -> b #

foldr' :: (a -> b -> b) -> b -> PredefinedType a -> b #

foldl :: (b -> a -> b) -> b -> PredefinedType a -> b #

foldl' :: (b -> a -> b) -> b -> PredefinedType a -> b #

foldr1 :: (a -> a -> a) -> PredefinedType a -> a #

foldl1 :: (a -> a -> a) -> PredefinedType a -> a #

toList :: PredefinedType a -> [a] #

null :: PredefinedType a -> Bool #

length :: PredefinedType a -> Int #

elem :: Eq a => a -> PredefinedType a -> Bool #

maximum :: Ord a => PredefinedType a -> a #

minimum :: Ord a => PredefinedType a -> a #

sum :: Num a => PredefinedType a -> a #

product :: Num a => PredefinedType a -> a #

Traversable PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> PredefinedType a -> f (PredefinedType b) #

sequenceA :: Applicative f => PredefinedType (f a) -> f (PredefinedType a) #

mapM :: Monad m => (a -> m b) -> PredefinedType a -> m (PredefinedType b) #

sequence :: Monad m => PredefinedType (m a) -> m (PredefinedType a) #

SymbolMatching PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match PredefinedType)

matchers :: B (Int, Match PredefinedType)

Eq a => Eq (PredefinedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (PredefinedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (PredefinedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (PredefinedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (PredefinedType a) :: Type -> Type #

Generic1 PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 PredefinedType :: k -> Type #

Methods

from1 :: forall (a :: k). PredefinedType a -> Rep1 PredefinedType a #

to1 :: forall (a :: k). Rep1 PredefinedType a -> PredefinedType a #

type Rep (PredefinedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (PredefinedType a) = D1 ('MetaData "PredefinedType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "PredefinedType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 PredefinedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 PredefinedType = D1 ('MetaData "PredefinedType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "PredefinedType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data ParenthesizedType a Source #

Instances

Instances details
Functor ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ParenthesizedType m -> m #

foldMap :: Monoid m => (a -> m) -> ParenthesizedType a -> m #

foldMap' :: Monoid m => (a -> m) -> ParenthesizedType a -> m #

foldr :: (a -> b -> b) -> b -> ParenthesizedType a -> b #

foldr' :: (a -> b -> b) -> b -> ParenthesizedType a -> b #

foldl :: (b -> a -> b) -> b -> ParenthesizedType a -> b #

foldl' :: (b -> a -> b) -> b -> ParenthesizedType a -> b #

foldr1 :: (a -> a -> a) -> ParenthesizedType a -> a #

foldl1 :: (a -> a -> a) -> ParenthesizedType a -> a #

toList :: ParenthesizedType a -> [a] #

null :: ParenthesizedType a -> Bool #

length :: ParenthesizedType a -> Int #

elem :: Eq a => a -> ParenthesizedType a -> Bool #

maximum :: Ord a => ParenthesizedType a -> a #

minimum :: Ord a => ParenthesizedType a -> a #

sum :: Num a => ParenthesizedType a -> a #

product :: Num a => ParenthesizedType a -> a #

Traversable ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ParenthesizedType a -> f (ParenthesizedType b) #

sequenceA :: Applicative f => ParenthesizedType (f a) -> f (ParenthesizedType a) #

mapM :: Monad m => (a -> m b) -> ParenthesizedType a -> m (ParenthesizedType b) #

sequence :: Monad m => ParenthesizedType (m a) -> m (ParenthesizedType a) #

SymbolMatching ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ParenthesizedType a) :: Type -> Type #

Generic1 ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ParenthesizedType :: k -> Type #

Methods

from1 :: forall (a :: k). ParenthesizedType a -> Rep1 ParenthesizedType a #

to1 :: forall (a :: k). Rep1 ParenthesizedType a -> ParenthesizedType a #

type Rep (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ParenthesizedType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ParenthesizedExpression a Source #

Instances

Instances details
Functor ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ParenthesizedExpression m -> m #

foldMap :: Monoid m => (a -> m) -> ParenthesizedExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> ParenthesizedExpression a -> m #

foldr :: (a -> b -> b) -> b -> ParenthesizedExpression a -> b #

foldr' :: (a -> b -> b) -> b -> ParenthesizedExpression a -> b #

foldl :: (b -> a -> b) -> b -> ParenthesizedExpression a -> b #

foldl' :: (b -> a -> b) -> b -> ParenthesizedExpression a -> b #

foldr1 :: (a -> a -> a) -> ParenthesizedExpression a -> a #

foldl1 :: (a -> a -> a) -> ParenthesizedExpression a -> a #

toList :: ParenthesizedExpression a -> [a] #

null :: ParenthesizedExpression a -> Bool #

length :: ParenthesizedExpression a -> Int #

elem :: Eq a => a -> ParenthesizedExpression a -> Bool #

maximum :: Ord a => ParenthesizedExpression a -> a #

minimum :: Ord a => ParenthesizedExpression a -> a #

sum :: Num a => ParenthesizedExpression a -> a #

product :: Num a => ParenthesizedExpression a -> a #

Traversable ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ParenthesizedExpression a) :: Type -> Type #

Generic1 ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ParenthesizedExpression :: k -> Type #

type Rep (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ParenthesizedExpression a) = D1 ('MetaData "ParenthesizedExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ParenthesizedExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Expression :+: (SequenceExpression :+: TypeAnnotation)) a)))))
type Rep1 ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ParenthesizedExpression = D1 ('MetaData "ParenthesizedExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ParenthesizedExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: (SequenceExpression :+: TypeAnnotation)))))

data Pair a Source #

Instances

Instances details
Functor Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Pair a -> Pair b #

(<$) :: a -> Pair b -> Pair a #

Foldable Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Pair m -> m #

foldMap :: Monoid m => (a -> m) -> Pair a -> m #

foldMap' :: Monoid m => (a -> m) -> Pair a -> m #

foldr :: (a -> b -> b) -> b -> Pair a -> b #

foldr' :: (a -> b -> b) -> b -> Pair a -> b #

foldl :: (b -> a -> b) -> b -> Pair a -> b #

foldl' :: (b -> a -> b) -> b -> Pair a -> b #

foldr1 :: (a -> a -> a) -> Pair a -> a #

foldl1 :: (a -> a -> a) -> Pair a -> a #

toList :: Pair a -> [a] #

null :: Pair a -> Bool #

length :: Pair a -> Int #

elem :: Eq a => a -> Pair a -> Bool #

maximum :: Ord a => Pair a -> a #

minimum :: Ord a => Pair a -> a #

sum :: Num a => Pair a -> a #

product :: Num a => Pair a -> a #

Traversable Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Pair a -> f (Pair b) #

sequenceA :: Applicative f => Pair (f a) -> f (Pair a) #

mapM :: Monad m => (a -> m b) -> Pair a -> m (Pair b) #

sequence :: Monad m => Pair (m a) -> m (Pair a) #

SymbolMatching Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchedSymbols :: Proxy Pair -> [Int]

showFailure :: Proxy Pair -> Node -> String

Unmarshal Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Pair)

matchers :: B (Int, Match Pair)

Eq a => Eq (Pair a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Pair a -> Pair a -> Bool #

(/=) :: Pair a -> Pair a -> Bool #

Ord a => Ord (Pair a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Pair a -> Pair a -> Ordering #

(<) :: Pair a -> Pair a -> Bool #

(<=) :: Pair a -> Pair a -> Bool #

(>) :: Pair a -> Pair a -> Bool #

(>=) :: Pair a -> Pair a -> Bool #

max :: Pair a -> Pair a -> Pair a #

min :: Pair a -> Pair a -> Pair a #

Show a => Show (Pair a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Pair a -> ShowS #

show :: Pair a -> String #

showList :: [Pair a] -> ShowS #

Generic (Pair a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Pair a) :: Type -> Type #

Methods

from :: Pair a -> Rep (Pair a) x #

to :: Rep (Pair a) x -> Pair a #

Generic1 Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Pair :: k -> Type #

Methods

from1 :: forall (a :: k). Pair a -> Rep1 Pair a #

to1 :: forall (a :: k). Rep1 Pair a -> Pair a #

type Rep (Pair a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Pair a) = D1 ('MetaData "Pair" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Pair" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "key") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((ComputedPropertyName :+: Number) :+: (PropertyIdentifier :+: String)) a)))))
type Rep1 Pair Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data OptionalParameter a Source #

Instances

Instances details
Functor OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => OptionalParameter m -> m #

foldMap :: Monoid m => (a -> m) -> OptionalParameter a -> m #

foldMap' :: Monoid m => (a -> m) -> OptionalParameter a -> m #

foldr :: (a -> b -> b) -> b -> OptionalParameter a -> b #

foldr' :: (a -> b -> b) -> b -> OptionalParameter a -> b #

foldl :: (b -> a -> b) -> b -> OptionalParameter a -> b #

foldl' :: (b -> a -> b) -> b -> OptionalParameter a -> b #

foldr1 :: (a -> a -> a) -> OptionalParameter a -> a #

foldl1 :: (a -> a -> a) -> OptionalParameter a -> a #

toList :: OptionalParameter a -> [a] #

null :: OptionalParameter a -> Bool #

length :: OptionalParameter a -> Int #

elem :: Eq a => a -> OptionalParameter a -> Bool #

maximum :: Ord a => OptionalParameter a -> a #

minimum :: Ord a => OptionalParameter a -> a #

sum :: Num a => OptionalParameter a -> a #

product :: Num a => OptionalParameter a -> a #

Traversable OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> OptionalParameter a -> f (OptionalParameter b) #

sequenceA :: Applicative f => OptionalParameter (f a) -> f (OptionalParameter a) #

mapM :: Monad m => (a -> m b) -> OptionalParameter a -> m (OptionalParameter b) #

sequence :: Monad m => OptionalParameter (m a) -> m (OptionalParameter a) #

SymbolMatching OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (OptionalParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (OptionalParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (OptionalParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (OptionalParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (OptionalParameter a) :: Type -> Type #

Generic1 OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 OptionalParameter :: k -> Type #

Methods

from1 :: forall (a :: k). OptionalParameter a -> Rep1 OptionalParameter a #

to1 :: forall (a :: k). Rep1 OptionalParameter a -> OptionalParameter a #

type Rep (OptionalParameter a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (OptionalParameter a) = D1 ('MetaData "OptionalParameter" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "OptionalParameter" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Expression a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (((DestructuringPattern :+: (AccessibilityModifier :+: Identifier)) :+: (Readonly :+: (This :+: TypeAnnotation))) a))))))
type Rep1 OptionalParameter Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ObjectType a Source #

Instances

Instances details
Functor ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ObjectType a -> ObjectType b #

(<$) :: a -> ObjectType b -> ObjectType a #

Foldable ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ObjectType m -> m #

foldMap :: Monoid m => (a -> m) -> ObjectType a -> m #

foldMap' :: Monoid m => (a -> m) -> ObjectType a -> m #

foldr :: (a -> b -> b) -> b -> ObjectType a -> b #

foldr' :: (a -> b -> b) -> b -> ObjectType a -> b #

foldl :: (b -> a -> b) -> b -> ObjectType a -> b #

foldl' :: (b -> a -> b) -> b -> ObjectType a -> b #

foldr1 :: (a -> a -> a) -> ObjectType a -> a #

foldl1 :: (a -> a -> a) -> ObjectType a -> a #

toList :: ObjectType a -> [a] #

null :: ObjectType a -> Bool #

length :: ObjectType a -> Int #

elem :: Eq a => a -> ObjectType a -> Bool #

maximum :: Ord a => ObjectType a -> a #

minimum :: Ord a => ObjectType a -> a #

sum :: Num a => ObjectType a -> a #

product :: Num a => ObjectType a -> a #

Traversable ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ObjectType a -> f (ObjectType b) #

sequenceA :: Applicative f => ObjectType (f a) -> f (ObjectType a) #

mapM :: Monad m => (a -> m b) -> ObjectType a -> m (ObjectType b) #

sequence :: Monad m => ObjectType (m a) -> m (ObjectType a) #

SymbolMatching ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ObjectType)

matchers :: B (Int, Match ObjectType)

Eq a => Eq (ObjectType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: ObjectType a -> ObjectType a -> Bool #

(/=) :: ObjectType a -> ObjectType a -> Bool #

Ord a => Ord (ObjectType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ObjectType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ObjectType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ObjectType a) :: Type -> Type #

Methods

from :: ObjectType a -> Rep (ObjectType a) x #

to :: Rep (ObjectType a) x -> ObjectType a #

Generic1 ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ObjectType :: k -> Type #

Methods

from1 :: forall (a :: k). ObjectType a -> Rep1 ObjectType a #

to1 :: forall (a :: k). Rep1 ObjectType a -> ObjectType a #

type Rep (ObjectType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ObjectType a) = D1 ('MetaData "ObjectType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ObjectType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((CallSignature :+: (ConstructSignature :+: ExportStatement)) :+: (IndexSignature :+: (MethodSignature :+: PropertySignature))) a])))
type Rep1 ObjectType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ObjectType = D1 ('MetaData "ObjectType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ObjectType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ((CallSignature :+: (ConstructSignature :+: ExportStatement)) :+: (IndexSignature :+: (MethodSignature :+: PropertySignature))))))

data ObjectPattern a Source #

Instances

Instances details
Functor ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ObjectPattern a -> ObjectPattern b #

(<$) :: a -> ObjectPattern b -> ObjectPattern a #

Foldable ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ObjectPattern m -> m #

foldMap :: Monoid m => (a -> m) -> ObjectPattern a -> m #

foldMap' :: Monoid m => (a -> m) -> ObjectPattern a -> m #

foldr :: (a -> b -> b) -> b -> ObjectPattern a -> b #

foldr' :: (a -> b -> b) -> b -> ObjectPattern a -> b #

foldl :: (b -> a -> b) -> b -> ObjectPattern a -> b #

foldl' :: (b -> a -> b) -> b -> ObjectPattern a -> b #

foldr1 :: (a -> a -> a) -> ObjectPattern a -> a #

foldl1 :: (a -> a -> a) -> ObjectPattern a -> a #

toList :: ObjectPattern a -> [a] #

null :: ObjectPattern a -> Bool #

length :: ObjectPattern a -> Int #

elem :: Eq a => a -> ObjectPattern a -> Bool #

maximum :: Ord a => ObjectPattern a -> a #

minimum :: Ord a => ObjectPattern a -> a #

sum :: Num a => ObjectPattern a -> a #

product :: Num a => ObjectPattern a -> a #

Traversable ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ObjectPattern a -> f (ObjectPattern b) #

sequenceA :: Applicative f => ObjectPattern (f a) -> f (ObjectPattern a) #

mapM :: Monad m => (a -> m b) -> ObjectPattern a -> m (ObjectPattern b) #

sequence :: Monad m => ObjectPattern (m a) -> m (ObjectPattern a) #

SymbolMatching ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ObjectPattern)

matchers :: B (Int, Match ObjectPattern)

Eq a => Eq (ObjectPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ObjectPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ObjectPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ObjectPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ObjectPattern a) :: Type -> Type #

Generic1 ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ObjectPattern :: k -> Type #

Methods

from1 :: forall (a :: k). ObjectPattern a -> Rep1 ObjectPattern a #

to1 :: forall (a :: k). Rep1 ObjectPattern a -> ObjectPattern a #

type Rep (ObjectPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ObjectPattern a) = D1 ('MetaData "ObjectPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ObjectPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((AssignmentPattern :+: MethodDefinition) :+: (Pair :+: (ShorthandPropertyIdentifier :+: SpreadElement))) a])))
type Rep1 ObjectPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ObjectPattern = D1 ('MetaData "ObjectPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ObjectPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ((AssignmentPattern :+: MethodDefinition) :+: (Pair :+: (ShorthandPropertyIdentifier :+: SpreadElement))))))

data Object a Source #

Instances

Instances details
Functor Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Object a -> Object b #

(<$) :: a -> Object b -> Object a #

Foldable Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Object m -> m #

foldMap :: Monoid m => (a -> m) -> Object a -> m #

foldMap' :: Monoid m => (a -> m) -> Object a -> m #

foldr :: (a -> b -> b) -> b -> Object a -> b #

foldr' :: (a -> b -> b) -> b -> Object a -> b #

foldl :: (b -> a -> b) -> b -> Object a -> b #

foldl' :: (b -> a -> b) -> b -> Object a -> b #

foldr1 :: (a -> a -> a) -> Object a -> a #

foldl1 :: (a -> a -> a) -> Object a -> a #

toList :: Object a -> [a] #

null :: Object a -> Bool #

length :: Object a -> Int #

elem :: Eq a => a -> Object a -> Bool #

maximum :: Ord a => Object a -> a #

minimum :: Ord a => Object a -> a #

sum :: Num a => Object a -> a #

product :: Num a => Object a -> a #

Traversable Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Object a -> f (Object b) #

sequenceA :: Applicative f => Object (f a) -> f (Object a) #

mapM :: Monad m => (a -> m b) -> Object a -> m (Object b) #

sequence :: Monad m => Object (m a) -> m (Object a) #

SymbolMatching Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Object)

matchers :: B (Int, Match Object)

Eq a => Eq (Object a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Object a -> Object a -> Bool #

(/=) :: Object a -> Object a -> Bool #

Ord a => Ord (Object a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Object a -> Object a -> Ordering #

(<) :: Object a -> Object a -> Bool #

(<=) :: Object a -> Object a -> Bool #

(>) :: Object a -> Object a -> Bool #

(>=) :: Object a -> Object a -> Bool #

max :: Object a -> Object a -> Object a #

min :: Object a -> Object a -> Object a #

Show a => Show (Object a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Object a -> ShowS #

show :: Object a -> String #

showList :: [Object a] -> ShowS #

Generic (Object a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Object a) :: Type -> Type #

Methods

from :: Object a -> Rep (Object a) x #

to :: Rep (Object a) x -> Object a #

Generic1 Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Object :: k -> Type #

Methods

from1 :: forall (a :: k). Object a -> Rep1 Object a #

to1 :: forall (a :: k). Rep1 Object a -> Object a #

type Rep (Object a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Object a) = D1 ('MetaData "Object" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Object" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((AssignmentPattern :+: MethodDefinition) :+: (Pair :+: (ShorthandPropertyIdentifier :+: SpreadElement))) a])))
type Rep1 Object Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Object = D1 ('MetaData "Object" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Object" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ((AssignmentPattern :+: MethodDefinition) :+: (Pair :+: (ShorthandPropertyIdentifier :+: SpreadElement))))))

data NonNullExpression a Source #

Constructors

NonNullExpression 

Fields

Instances

Instances details
Functor NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => NonNullExpression m -> m #

foldMap :: Monoid m => (a -> m) -> NonNullExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> NonNullExpression a -> m #

foldr :: (a -> b -> b) -> b -> NonNullExpression a -> b #

foldr' :: (a -> b -> b) -> b -> NonNullExpression a -> b #

foldl :: (b -> a -> b) -> b -> NonNullExpression a -> b #

foldl' :: (b -> a -> b) -> b -> NonNullExpression a -> b #

foldr1 :: (a -> a -> a) -> NonNullExpression a -> a #

foldl1 :: (a -> a -> a) -> NonNullExpression a -> a #

toList :: NonNullExpression a -> [a] #

null :: NonNullExpression a -> Bool #

length :: NonNullExpression a -> Int #

elem :: Eq a => a -> NonNullExpression a -> Bool #

maximum :: Ord a => NonNullExpression a -> a #

minimum :: Ord a => NonNullExpression a -> a #

sum :: Num a => NonNullExpression a -> a #

product :: Num a => NonNullExpression a -> a #

Traversable NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> NonNullExpression a -> f (NonNullExpression b) #

sequenceA :: Applicative f => NonNullExpression (f a) -> f (NonNullExpression a) #

mapM :: Monad m => (a -> m b) -> NonNullExpression a -> m (NonNullExpression b) #

sequence :: Monad m => NonNullExpression (m a) -> m (NonNullExpression a) #

SymbolMatching NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (NonNullExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (NonNullExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (NonNullExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (NonNullExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (NonNullExpression a) :: Type -> Type #

Generic1 NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 NonNullExpression :: k -> Type #

Methods

from1 :: forall (a :: k). NonNullExpression a -> Rep1 NonNullExpression a #

to1 :: forall (a :: k). Rep1 NonNullExpression a -> NonNullExpression a #

type Rep (NonNullExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (NonNullExpression a) = D1 ('MetaData "NonNullExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NonNullExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 NonNullExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 NonNullExpression = D1 ('MetaData "NonNullExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NonNullExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data NewExpression a Source #

Instances

Instances details
Functor NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> NewExpression a -> NewExpression b #

(<$) :: a -> NewExpression b -> NewExpression a #

Foldable NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => NewExpression m -> m #

foldMap :: Monoid m => (a -> m) -> NewExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> NewExpression a -> m #

foldr :: (a -> b -> b) -> b -> NewExpression a -> b #

foldr' :: (a -> b -> b) -> b -> NewExpression a -> b #

foldl :: (b -> a -> b) -> b -> NewExpression a -> b #

foldl' :: (b -> a -> b) -> b -> NewExpression a -> b #

foldr1 :: (a -> a -> a) -> NewExpression a -> a #

foldl1 :: (a -> a -> a) -> NewExpression a -> a #

toList :: NewExpression a -> [a] #

null :: NewExpression a -> Bool #

length :: NewExpression a -> Int #

elem :: Eq a => a -> NewExpression a -> Bool #

maximum :: Ord a => NewExpression a -> a #

minimum :: Ord a => NewExpression a -> a #

sum :: Num a => NewExpression a -> a #

product :: Num a => NewExpression a -> a #

Traversable NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> NewExpression a -> f (NewExpression b) #

sequenceA :: Applicative f => NewExpression (f a) -> f (NewExpression a) #

mapM :: Monad m => (a -> m b) -> NewExpression a -> m (NewExpression b) #

sequence :: Monad m => NewExpression (m a) -> m (NewExpression a) #

SymbolMatching NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match NewExpression)

matchers :: B (Int, Match NewExpression)

Eq a => Eq (NewExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (NewExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (NewExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (NewExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (NewExpression a) :: Type -> Type #

Generic1 NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 NewExpression :: k -> Type #

Methods

from1 :: forall (a :: k). NewExpression a -> Rep1 NewExpression a #

to1 :: forall (a :: k). Rep1 NewExpression a -> NewExpression a #

type Rep (NewExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 NewExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data NestedTypeIdentifier a Source #

Instances

Instances details
Functor NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => NestedTypeIdentifier m -> m #

foldMap :: Monoid m => (a -> m) -> NestedTypeIdentifier a -> m #

foldMap' :: Monoid m => (a -> m) -> NestedTypeIdentifier a -> m #

foldr :: (a -> b -> b) -> b -> NestedTypeIdentifier a -> b #

foldr' :: (a -> b -> b) -> b -> NestedTypeIdentifier a -> b #

foldl :: (b -> a -> b) -> b -> NestedTypeIdentifier a -> b #

foldl' :: (b -> a -> b) -> b -> NestedTypeIdentifier a -> b #

foldr1 :: (a -> a -> a) -> NestedTypeIdentifier a -> a #

foldl1 :: (a -> a -> a) -> NestedTypeIdentifier a -> a #

toList :: NestedTypeIdentifier a -> [a] #

null :: NestedTypeIdentifier a -> Bool #

length :: NestedTypeIdentifier a -> Int #

elem :: Eq a => a -> NestedTypeIdentifier a -> Bool #

maximum :: Ord a => NestedTypeIdentifier a -> a #

minimum :: Ord a => NestedTypeIdentifier a -> a #

sum :: Num a => NestedTypeIdentifier a -> a #

product :: Num a => NestedTypeIdentifier a -> a #

Traversable NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (NestedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (NestedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (NestedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (NestedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (NestedTypeIdentifier a) :: Type -> Type #

Generic1 NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 NestedTypeIdentifier :: k -> Type #

Methods

from1 :: forall (a :: k). NestedTypeIdentifier a -> Rep1 NestedTypeIdentifier a #

to1 :: forall (a :: k). Rep1 NestedTypeIdentifier a -> NestedTypeIdentifier a #

type Rep (NestedTypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (NestedTypeIdentifier a) = D1 ('MetaData "NestedTypeIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NestedTypeIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: S1 ('MetaSel ('Just "module'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: NestedIdentifier) a)))))
type Rep1 NestedTypeIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 NestedTypeIdentifier = D1 ('MetaData "NestedTypeIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NestedTypeIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 TypeIdentifier) :*: S1 ('MetaSel ('Just "module'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Identifier :+: NestedIdentifier)))))

data NestedIdentifier a Source #

Instances

Instances details
Functor NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> NestedIdentifier a -> NestedIdentifier b #

(<$) :: a -> NestedIdentifier b -> NestedIdentifier a #

Foldable NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => NestedIdentifier m -> m #

foldMap :: Monoid m => (a -> m) -> NestedIdentifier a -> m #

foldMap' :: Monoid m => (a -> m) -> NestedIdentifier a -> m #

foldr :: (a -> b -> b) -> b -> NestedIdentifier a -> b #

foldr' :: (a -> b -> b) -> b -> NestedIdentifier a -> b #

foldl :: (b -> a -> b) -> b -> NestedIdentifier a -> b #

foldl' :: (b -> a -> b) -> b -> NestedIdentifier a -> b #

foldr1 :: (a -> a -> a) -> NestedIdentifier a -> a #

foldl1 :: (a -> a -> a) -> NestedIdentifier a -> a #

toList :: NestedIdentifier a -> [a] #

null :: NestedIdentifier a -> Bool #

length :: NestedIdentifier a -> Int #

elem :: Eq a => a -> NestedIdentifier a -> Bool #

maximum :: Ord a => NestedIdentifier a -> a #

minimum :: Ord a => NestedIdentifier a -> a #

sum :: Num a => NestedIdentifier a -> a #

product :: Num a => NestedIdentifier a -> a #

Traversable NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> NestedIdentifier a -> f (NestedIdentifier b) #

sequenceA :: Applicative f => NestedIdentifier (f a) -> f (NestedIdentifier a) #

mapM :: Monad m => (a -> m b) -> NestedIdentifier a -> m (NestedIdentifier b) #

sequence :: Monad m => NestedIdentifier (m a) -> m (NestedIdentifier a) #

SymbolMatching NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (NestedIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (NestedIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (NestedIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (NestedIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (NestedIdentifier a) :: Type -> Type #

Generic1 NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 NestedIdentifier :: k -> Type #

Methods

from1 :: forall (a :: k). NestedIdentifier a -> Rep1 NestedIdentifier a #

to1 :: forall (a :: k). Rep1 NestedIdentifier a -> NestedIdentifier a #

type Rep (NestedIdentifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (NestedIdentifier a) = D1 ('MetaData "NestedIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NestedIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Identifier :+: NestedIdentifier) a)))))
type Rep1 NestedIdentifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 NestedIdentifier = D1 ('MetaData "NestedIdentifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NestedIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Identifier :+: NestedIdentifier))))

data NamespaceImport a Source #

Constructors

NamespaceImport 

Fields

Instances

Instances details
Functor NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> NamespaceImport a -> NamespaceImport b #

(<$) :: a -> NamespaceImport b -> NamespaceImport a #

Foldable NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => NamespaceImport m -> m #

foldMap :: Monoid m => (a -> m) -> NamespaceImport a -> m #

foldMap' :: Monoid m => (a -> m) -> NamespaceImport a -> m #

foldr :: (a -> b -> b) -> b -> NamespaceImport a -> b #

foldr' :: (a -> b -> b) -> b -> NamespaceImport a -> b #

foldl :: (b -> a -> b) -> b -> NamespaceImport a -> b #

foldl' :: (b -> a -> b) -> b -> NamespaceImport a -> b #

foldr1 :: (a -> a -> a) -> NamespaceImport a -> a #

foldl1 :: (a -> a -> a) -> NamespaceImport a -> a #

toList :: NamespaceImport a -> [a] #

null :: NamespaceImport a -> Bool #

length :: NamespaceImport a -> Int #

elem :: Eq a => a -> NamespaceImport a -> Bool #

maximum :: Ord a => NamespaceImport a -> a #

minimum :: Ord a => NamespaceImport a -> a #

sum :: Num a => NamespaceImport a -> a #

product :: Num a => NamespaceImport a -> a #

Traversable NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> NamespaceImport a -> f (NamespaceImport b) #

sequenceA :: Applicative f => NamespaceImport (f a) -> f (NamespaceImport a) #

mapM :: Monad m => (a -> m b) -> NamespaceImport a -> m (NamespaceImport b) #

sequence :: Monad m => NamespaceImport (m a) -> m (NamespaceImport a) #

SymbolMatching NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (NamespaceImport a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (NamespaceImport a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (NamespaceImport a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (NamespaceImport a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (NamespaceImport a) :: Type -> Type #

Generic1 NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 NamespaceImport :: k -> Type #

Methods

from1 :: forall (a :: k). NamespaceImport a -> Rep1 NamespaceImport a #

to1 :: forall (a :: k). Rep1 NamespaceImport a -> NamespaceImport a #

type Rep (NamespaceImport a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (NamespaceImport a) = D1 ('MetaData "NamespaceImport" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NamespaceImport" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identifier a))))
type Rep1 NamespaceImport Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 NamespaceImport = D1 ('MetaData "NamespaceImport" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NamespaceImport" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Identifier)))

data NamedImports a Source #

Constructors

NamedImports 

Fields

Instances

Instances details
Functor NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> NamedImports a -> NamedImports b #

(<$) :: a -> NamedImports b -> NamedImports a #

Foldable NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => NamedImports m -> m #

foldMap :: Monoid m => (a -> m) -> NamedImports a -> m #

foldMap' :: Monoid m => (a -> m) -> NamedImports a -> m #

foldr :: (a -> b -> b) -> b -> NamedImports a -> b #

foldr' :: (a -> b -> b) -> b -> NamedImports a -> b #

foldl :: (b -> a -> b) -> b -> NamedImports a -> b #

foldl' :: (b -> a -> b) -> b -> NamedImports a -> b #

foldr1 :: (a -> a -> a) -> NamedImports a -> a #

foldl1 :: (a -> a -> a) -> NamedImports a -> a #

toList :: NamedImports a -> [a] #

null :: NamedImports a -> Bool #

length :: NamedImports a -> Int #

elem :: Eq a => a -> NamedImports a -> Bool #

maximum :: Ord a => NamedImports a -> a #

minimum :: Ord a => NamedImports a -> a #

sum :: Num a => NamedImports a -> a #

product :: Num a => NamedImports a -> a #

Traversable NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> NamedImports a -> f (NamedImports b) #

sequenceA :: Applicative f => NamedImports (f a) -> f (NamedImports a) #

mapM :: Monad m => (a -> m b) -> NamedImports a -> m (NamedImports b) #

sequence :: Monad m => NamedImports (m a) -> m (NamedImports a) #

SymbolMatching NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match NamedImports)

matchers :: B (Int, Match NamedImports)

Eq a => Eq (NamedImports a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (NamedImports a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (NamedImports a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (NamedImports a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (NamedImports a) :: Type -> Type #

Methods

from :: NamedImports a -> Rep (NamedImports a) x #

to :: Rep (NamedImports a) x -> NamedImports a #

Generic1 NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 NamedImports :: k -> Type #

Methods

from1 :: forall (a :: k). NamedImports a -> Rep1 NamedImports a #

to1 :: forall (a :: k). Rep1 NamedImports a -> NamedImports a #

type Rep (NamedImports a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (NamedImports a) = D1 ('MetaData "NamedImports" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NamedImports" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ImportSpecifier a])))
type Rep1 NamedImports Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 NamedImports = D1 ('MetaData "NamedImports" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "NamedImports" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ImportSpecifier)))

data Module a Source #

Constructors

Module 

Instances

Instances details
Functor Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Module a -> Module b #

(<$) :: a -> Module b -> Module a #

Foldable Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Module m -> m #

foldMap :: Monoid m => (a -> m) -> Module a -> m #

foldMap' :: Monoid m => (a -> m) -> Module a -> m #

foldr :: (a -> b -> b) -> b -> Module a -> b #

foldr' :: (a -> b -> b) -> b -> Module a -> b #

foldl :: (b -> a -> b) -> b -> Module a -> b #

foldl' :: (b -> a -> b) -> b -> Module a -> b #

foldr1 :: (a -> a -> a) -> Module a -> a #

foldl1 :: (a -> a -> a) -> Module a -> a #

toList :: Module a -> [a] #

null :: Module a -> Bool #

length :: Module a -> Int #

elem :: Eq a => a -> Module a -> Bool #

maximum :: Ord a => Module a -> a #

minimum :: Ord a => Module a -> a #

sum :: Num a => Module a -> a #

product :: Num a => Module a -> a #

Traversable Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Module a -> f (Module b) #

sequenceA :: Applicative f => Module (f a) -> f (Module a) #

mapM :: Monad m => (a -> m b) -> Module a -> m (Module b) #

sequence :: Monad m => Module (m a) -> m (Module a) #

SymbolMatching Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Module)

matchers :: B (Int, Match Module)

Eq a => Eq (Module a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Module a -> Module a -> Bool #

(/=) :: Module a -> Module a -> Bool #

Ord a => Ord (Module a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Module a -> Module a -> Ordering #

(<) :: Module a -> Module a -> Bool #

(<=) :: Module a -> Module a -> Bool #

(>) :: Module a -> Module a -> Bool #

(>=) :: Module a -> Module a -> Bool #

max :: Module a -> Module a -> Module a #

min :: Module a -> Module a -> Module a #

Show a => Show (Module a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Module a -> ShowS #

show :: Module a -> String #

showList :: [Module a] -> ShowS #

Generic (Module a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Module a) :: Type -> Type #

Methods

from :: Module a -> Rep (Module a) x #

to :: Rep (Module a) x -> Module a #

Generic1 Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Module :: k -> Type #

Methods

from1 :: forall (a :: k). Module a -> Rep1 Module a #

to1 :: forall (a :: k). Rep1 Module a -> Module a #

type Rep (Module a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Module a) = D1 ('MetaData "Module" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Module" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (StatementBlock a))) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: (NestedIdentifier :+: String)) a)))))
type Rep1 Module Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data MethodSignature a Source #

Instances

Instances details
Functor MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> MethodSignature a -> MethodSignature b #

(<$) :: a -> MethodSignature b -> MethodSignature a #

Foldable MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => MethodSignature m -> m #

foldMap :: Monoid m => (a -> m) -> MethodSignature a -> m #

foldMap' :: Monoid m => (a -> m) -> MethodSignature a -> m #

foldr :: (a -> b -> b) -> b -> MethodSignature a -> b #

foldr' :: (a -> b -> b) -> b -> MethodSignature a -> b #

foldl :: (b -> a -> b) -> b -> MethodSignature a -> b #

foldl' :: (b -> a -> b) -> b -> MethodSignature a -> b #

foldr1 :: (a -> a -> a) -> MethodSignature a -> a #

foldl1 :: (a -> a -> a) -> MethodSignature a -> a #

toList :: MethodSignature a -> [a] #

null :: MethodSignature a -> Bool #

length :: MethodSignature a -> Int #

elem :: Eq a => a -> MethodSignature a -> Bool #

maximum :: Ord a => MethodSignature a -> a #

minimum :: Ord a => MethodSignature a -> a #

sum :: Num a => MethodSignature a -> a #

product :: Num a => MethodSignature a -> a #

Traversable MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> MethodSignature a -> f (MethodSignature b) #

sequenceA :: Applicative f => MethodSignature (f a) -> f (MethodSignature a) #

mapM :: Monad m => (a -> m b) -> MethodSignature a -> m (MethodSignature b) #

sequence :: Monad m => MethodSignature (m a) -> m (MethodSignature a) #

SymbolMatching MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (MethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (MethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (MethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (MethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (MethodSignature a) :: Type -> Type #

Generic1 MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 MethodSignature :: k -> Type #

Methods

from1 :: forall (a :: k). MethodSignature a -> Rep1 MethodSignature a #

to1 :: forall (a :: k). Rep1 MethodSignature a -> MethodSignature a #

type Rep (MethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 MethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data MethodDefinition a Source #

Instances

Instances details
Functor MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> MethodDefinition a -> MethodDefinition b #

(<$) :: a -> MethodDefinition b -> MethodDefinition a #

Foldable MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => MethodDefinition m -> m #

foldMap :: Monoid m => (a -> m) -> MethodDefinition a -> m #

foldMap' :: Monoid m => (a -> m) -> MethodDefinition a -> m #

foldr :: (a -> b -> b) -> b -> MethodDefinition a -> b #

foldr' :: (a -> b -> b) -> b -> MethodDefinition a -> b #

foldl :: (b -> a -> b) -> b -> MethodDefinition a -> b #

foldl' :: (b -> a -> b) -> b -> MethodDefinition a -> b #

foldr1 :: (a -> a -> a) -> MethodDefinition a -> a #

foldl1 :: (a -> a -> a) -> MethodDefinition a -> a #

toList :: MethodDefinition a -> [a] #

null :: MethodDefinition a -> Bool #

length :: MethodDefinition a -> Int #

elem :: Eq a => a -> MethodDefinition a -> Bool #

maximum :: Ord a => MethodDefinition a -> a #

minimum :: Ord a => MethodDefinition a -> a #

sum :: Num a => MethodDefinition a -> a #

product :: Num a => MethodDefinition a -> a #

Traversable MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> MethodDefinition a -> f (MethodDefinition b) #

sequenceA :: Applicative f => MethodDefinition (f a) -> f (MethodDefinition a) #

mapM :: Monad m => (a -> m b) -> MethodDefinition a -> m (MethodDefinition b) #

sequence :: Monad m => MethodDefinition (m a) -> m (MethodDefinition a) #

SymbolMatching MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (MethodDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (MethodDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (MethodDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (MethodDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (MethodDefinition a) :: Type -> Type #

Generic1 MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 MethodDefinition :: k -> Type #

Methods

from1 :: forall (a :: k). MethodDefinition a -> Rep1 MethodDefinition a #

to1 :: forall (a :: k). Rep1 MethodDefinition a -> MethodDefinition a #

type Rep (MethodDefinition a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 MethodDefinition Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data MetaProperty a Source #

Constructors

MetaProperty 

Fields

Instances

Instances details
Functor MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> MetaProperty a -> MetaProperty b #

(<$) :: a -> MetaProperty b -> MetaProperty a #

Foldable MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => MetaProperty m -> m #

foldMap :: Monoid m => (a -> m) -> MetaProperty a -> m #

foldMap' :: Monoid m => (a -> m) -> MetaProperty a -> m #

foldr :: (a -> b -> b) -> b -> MetaProperty a -> b #

foldr' :: (a -> b -> b) -> b -> MetaProperty a -> b #

foldl :: (b -> a -> b) -> b -> MetaProperty a -> b #

foldl' :: (b -> a -> b) -> b -> MetaProperty a -> b #

foldr1 :: (a -> a -> a) -> MetaProperty a -> a #

foldl1 :: (a -> a -> a) -> MetaProperty a -> a #

toList :: MetaProperty a -> [a] #

null :: MetaProperty a -> Bool #

length :: MetaProperty a -> Int #

elem :: Eq a => a -> MetaProperty a -> Bool #

maximum :: Ord a => MetaProperty a -> a #

minimum :: Ord a => MetaProperty a -> a #

sum :: Num a => MetaProperty a -> a #

product :: Num a => MetaProperty a -> a #

Traversable MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> MetaProperty a -> f (MetaProperty b) #

sequenceA :: Applicative f => MetaProperty (f a) -> f (MetaProperty a) #

mapM :: Monad m => (a -> m b) -> MetaProperty a -> m (MetaProperty b) #

sequence :: Monad m => MetaProperty (m a) -> m (MetaProperty a) #

SymbolMatching MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match MetaProperty)

matchers :: B (Int, Match MetaProperty)

Eq a => Eq (MetaProperty a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (MetaProperty a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (MetaProperty a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (MetaProperty a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (MetaProperty a) :: Type -> Type #

Methods

from :: MetaProperty a -> Rep (MetaProperty a) x #

to :: Rep (MetaProperty a) x -> MetaProperty a #

Generic1 MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 MetaProperty :: k -> Type #

Methods

from1 :: forall (a :: k). MetaProperty a -> Rep1 MetaProperty a #

to1 :: forall (a :: k). Rep1 MetaProperty a -> MetaProperty a #

type Rep (MetaProperty a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (MetaProperty a) = D1 ('MetaData "MetaProperty" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "MetaProperty" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 MetaProperty Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 MetaProperty = D1 ('MetaData "MetaProperty" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "MetaProperty" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data MemberExpression a Source #

Constructors

MemberExpression 

Fields

Instances

Instances details
Functor MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> MemberExpression a -> MemberExpression b #

(<$) :: a -> MemberExpression b -> MemberExpression a #

Foldable MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => MemberExpression m -> m #

foldMap :: Monoid m => (a -> m) -> MemberExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> MemberExpression a -> m #

foldr :: (a -> b -> b) -> b -> MemberExpression a -> b #

foldr' :: (a -> b -> b) -> b -> MemberExpression a -> b #

foldl :: (b -> a -> b) -> b -> MemberExpression a -> b #

foldl' :: (b -> a -> b) -> b -> MemberExpression a -> b #

foldr1 :: (a -> a -> a) -> MemberExpression a -> a #

foldl1 :: (a -> a -> a) -> MemberExpression a -> a #

toList :: MemberExpression a -> [a] #

null :: MemberExpression a -> Bool #

length :: MemberExpression a -> Int #

elem :: Eq a => a -> MemberExpression a -> Bool #

maximum :: Ord a => MemberExpression a -> a #

minimum :: Ord a => MemberExpression a -> a #

sum :: Num a => MemberExpression a -> a #

product :: Num a => MemberExpression a -> a #

Traversable MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> MemberExpression a -> f (MemberExpression b) #

sequenceA :: Applicative f => MemberExpression (f a) -> f (MemberExpression a) #

mapM :: Monad m => (a -> m b) -> MemberExpression a -> m (MemberExpression b) #

sequence :: Monad m => MemberExpression (m a) -> m (MemberExpression a) #

SymbolMatching MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (MemberExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (MemberExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (MemberExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (MemberExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (MemberExpression a) :: Type -> Type #

Generic1 MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 MemberExpression :: k -> Type #

Methods

from1 :: forall (a :: k). MemberExpression a -> Rep1 MemberExpression a #

to1 :: forall (a :: k). Rep1 MemberExpression a -> MemberExpression a #

type Rep (MemberExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (MemberExpression a) = D1 ('MetaData "MemberExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "MemberExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "property") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PropertyIdentifier a)) :*: S1 ('MetaSel ('Just "object") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 MemberExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 MemberExpression = D1 ('MetaData "MemberExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "MemberExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "property") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 PropertyIdentifier) :*: S1 ('MetaSel ('Just "object") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data MappedTypeClause a Source #

Instances

Instances details
Functor MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> MappedTypeClause a -> MappedTypeClause b #

(<$) :: a -> MappedTypeClause b -> MappedTypeClause a #

Foldable MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => MappedTypeClause m -> m #

foldMap :: Monoid m => (a -> m) -> MappedTypeClause a -> m #

foldMap' :: Monoid m => (a -> m) -> MappedTypeClause a -> m #

foldr :: (a -> b -> b) -> b -> MappedTypeClause a -> b #

foldr' :: (a -> b -> b) -> b -> MappedTypeClause a -> b #

foldl :: (b -> a -> b) -> b -> MappedTypeClause a -> b #

foldl' :: (b -> a -> b) -> b -> MappedTypeClause a -> b #

foldr1 :: (a -> a -> a) -> MappedTypeClause a -> a #

foldl1 :: (a -> a -> a) -> MappedTypeClause a -> a #

toList :: MappedTypeClause a -> [a] #

null :: MappedTypeClause a -> Bool #

length :: MappedTypeClause a -> Int #

elem :: Eq a => a -> MappedTypeClause a -> Bool #

maximum :: Ord a => MappedTypeClause a -> a #

minimum :: Ord a => MappedTypeClause a -> a #

sum :: Num a => MappedTypeClause a -> a #

product :: Num a => MappedTypeClause a -> a #

Traversable MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> MappedTypeClause a -> f (MappedTypeClause b) #

sequenceA :: Applicative f => MappedTypeClause (f a) -> f (MappedTypeClause a) #

mapM :: Monad m => (a -> m b) -> MappedTypeClause a -> m (MappedTypeClause b) #

sequence :: Monad m => MappedTypeClause (m a) -> m (MappedTypeClause a) #

SymbolMatching MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (MappedTypeClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (MappedTypeClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (MappedTypeClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (MappedTypeClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (MappedTypeClause a) :: Type -> Type #

Generic1 MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 MappedTypeClause :: k -> Type #

Methods

from1 :: forall (a :: k). MappedTypeClause a -> Rep1 MappedTypeClause a #

to1 :: forall (a :: k). Rep1 MappedTypeClause a -> MappedTypeClause a #

type Rep (MappedTypeClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 MappedTypeClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data LookupType a Source #

Instances

Instances details
Functor LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> LookupType a -> LookupType b #

(<$) :: a -> LookupType b -> LookupType a #

Foldable LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => LookupType m -> m #

foldMap :: Monoid m => (a -> m) -> LookupType a -> m #

foldMap' :: Monoid m => (a -> m) -> LookupType a -> m #

foldr :: (a -> b -> b) -> b -> LookupType a -> b #

foldr' :: (a -> b -> b) -> b -> LookupType a -> b #

foldl :: (b -> a -> b) -> b -> LookupType a -> b #

foldl' :: (b -> a -> b) -> b -> LookupType a -> b #

foldr1 :: (a -> a -> a) -> LookupType a -> a #

foldl1 :: (a -> a -> a) -> LookupType a -> a #

toList :: LookupType a -> [a] #

null :: LookupType a -> Bool #

length :: LookupType a -> Int #

elem :: Eq a => a -> LookupType a -> Bool #

maximum :: Ord a => LookupType a -> a #

minimum :: Ord a => LookupType a -> a #

sum :: Num a => LookupType a -> a #

product :: Num a => LookupType a -> a #

Traversable LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> LookupType a -> f (LookupType b) #

sequenceA :: Applicative f => LookupType (f a) -> f (LookupType a) #

mapM :: Monad m => (a -> m b) -> LookupType a -> m (LookupType b) #

sequence :: Monad m => LookupType (m a) -> m (LookupType a) #

SymbolMatching LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match LookupType)

matchers :: B (Int, Match LookupType)

Eq a => Eq (LookupType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: LookupType a -> LookupType a -> Bool #

(/=) :: LookupType a -> LookupType a -> Bool #

Ord a => Ord (LookupType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (LookupType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (LookupType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (LookupType a) :: Type -> Type #

Methods

from :: LookupType a -> Rep (LookupType a) x #

to :: Rep (LookupType a) x -> LookupType a #

Generic1 LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 LookupType :: k -> Type #

Methods

from1 :: forall (a :: k). LookupType a -> Rep1 LookupType a #

to1 :: forall (a :: k). Rep1 LookupType a -> LookupType a #

type Rep (LookupType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 LookupType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data LiteralType a Source #

Instances

Instances details
Functor LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> LiteralType a -> LiteralType b #

(<$) :: a -> LiteralType b -> LiteralType a #

Foldable LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => LiteralType m -> m #

foldMap :: Monoid m => (a -> m) -> LiteralType a -> m #

foldMap' :: Monoid m => (a -> m) -> LiteralType a -> m #

foldr :: (a -> b -> b) -> b -> LiteralType a -> b #

foldr' :: (a -> b -> b) -> b -> LiteralType a -> b #

foldl :: (b -> a -> b) -> b -> LiteralType a -> b #

foldl' :: (b -> a -> b) -> b -> LiteralType a -> b #

foldr1 :: (a -> a -> a) -> LiteralType a -> a #

foldl1 :: (a -> a -> a) -> LiteralType a -> a #

toList :: LiteralType a -> [a] #

null :: LiteralType a -> Bool #

length :: LiteralType a -> Int #

elem :: Eq a => a -> LiteralType a -> Bool #

maximum :: Ord a => LiteralType a -> a #

minimum :: Ord a => LiteralType a -> a #

sum :: Num a => LiteralType a -> a #

product :: Num a => LiteralType a -> a #

Traversable LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> LiteralType a -> f (LiteralType b) #

sequenceA :: Applicative f => LiteralType (f a) -> f (LiteralType a) #

mapM :: Monad m => (a -> m b) -> LiteralType a -> m (LiteralType b) #

sequence :: Monad m => LiteralType (m a) -> m (LiteralType a) #

SymbolMatching LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match LiteralType)

matchers :: B (Int, Match LiteralType)

Eq a => Eq (LiteralType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (LiteralType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (LiteralType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (LiteralType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (LiteralType a) :: Type -> Type #

Methods

from :: LiteralType a -> Rep (LiteralType a) x #

to :: Rep (LiteralType a) x -> LiteralType a #

Generic1 LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 LiteralType :: k -> Type #

Methods

from1 :: forall (a :: k). LiteralType a -> Rep1 LiteralType a #

to1 :: forall (a :: k). Rep1 LiteralType a -> LiteralType a #

type Rep (LiteralType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (LiteralType a) = D1 ('MetaData "LiteralType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "LiteralType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((False :+: Number) :+: (String :+: (True :+: UnaryExpression))) a))))
type Rep1 LiteralType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 LiteralType = D1 ('MetaData "LiteralType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "LiteralType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ((False :+: Number) :+: (String :+: (True :+: UnaryExpression))))))

data LexicalDeclaration a Source #

Constructors

LexicalDeclaration 

Instances

Instances details
Functor LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => LexicalDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> LexicalDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> LexicalDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> LexicalDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> LexicalDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> LexicalDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> LexicalDeclaration a -> b #

foldr1 :: (a -> a -> a) -> LexicalDeclaration a -> a #

foldl1 :: (a -> a -> a) -> LexicalDeclaration a -> a #

toList :: LexicalDeclaration a -> [a] #

null :: LexicalDeclaration a -> Bool #

length :: LexicalDeclaration a -> Int #

elem :: Eq a => a -> LexicalDeclaration a -> Bool #

maximum :: Ord a => LexicalDeclaration a -> a #

minimum :: Ord a => LexicalDeclaration a -> a #

sum :: Num a => LexicalDeclaration a -> a #

product :: Num a => LexicalDeclaration a -> a #

Traversable LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (LexicalDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (LexicalDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (LexicalDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (LexicalDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (LexicalDeclaration a) :: Type -> Type #

Generic1 LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 LexicalDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). LexicalDeclaration a -> Rep1 LexicalDeclaration a #

to1 :: forall (a :: k). Rep1 LexicalDeclaration a -> LexicalDeclaration a #

type Rep (LexicalDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (LexicalDeclaration a) = D1 ('MetaData "LexicalDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "LexicalDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (VariableDeclarator a)))))
type Rep1 LexicalDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 LexicalDeclaration = D1 ('MetaData "LexicalDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "LexicalDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 VariableDeclarator)))

data LabeledStatement a Source #

Constructors

LabeledStatement 

Fields

Instances

Instances details
Functor LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> LabeledStatement a -> LabeledStatement b #

(<$) :: a -> LabeledStatement b -> LabeledStatement a #

Foldable LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => LabeledStatement m -> m #

foldMap :: Monoid m => (a -> m) -> LabeledStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> LabeledStatement a -> m #

foldr :: (a -> b -> b) -> b -> LabeledStatement a -> b #

foldr' :: (a -> b -> b) -> b -> LabeledStatement a -> b #

foldl :: (b -> a -> b) -> b -> LabeledStatement a -> b #

foldl' :: (b -> a -> b) -> b -> LabeledStatement a -> b #

foldr1 :: (a -> a -> a) -> LabeledStatement a -> a #

foldl1 :: (a -> a -> a) -> LabeledStatement a -> a #

toList :: LabeledStatement a -> [a] #

null :: LabeledStatement a -> Bool #

length :: LabeledStatement a -> Int #

elem :: Eq a => a -> LabeledStatement a -> Bool #

maximum :: Ord a => LabeledStatement a -> a #

minimum :: Ord a => LabeledStatement a -> a #

sum :: Num a => LabeledStatement a -> a #

product :: Num a => LabeledStatement a -> a #

Traversable LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> LabeledStatement a -> f (LabeledStatement b) #

sequenceA :: Applicative f => LabeledStatement (f a) -> f (LabeledStatement a) #

mapM :: Monad m => (a -> m b) -> LabeledStatement a -> m (LabeledStatement b) #

sequence :: Monad m => LabeledStatement (m a) -> m (LabeledStatement a) #

SymbolMatching LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (LabeledStatement a) :: Type -> Type #

Generic1 LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 LabeledStatement :: k -> Type #

Methods

from1 :: forall (a :: k). LabeledStatement a -> Rep1 LabeledStatement a #

to1 :: forall (a :: k). Rep1 LabeledStatement a -> LabeledStatement a #

type Rep (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (LabeledStatement a) = D1 ('MetaData "LabeledStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "LabeledStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (StatementIdentifier a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Statement a)))))
type Rep1 LabeledStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 LabeledStatement = D1 ('MetaData "LabeledStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "LabeledStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 StatementIdentifier) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Statement))))

data JsxSelfClosingElement a Source #

Instances

Instances details
Functor JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxSelfClosingElement m -> m #

foldMap :: Monoid m => (a -> m) -> JsxSelfClosingElement a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxSelfClosingElement a -> m #

foldr :: (a -> b -> b) -> b -> JsxSelfClosingElement a -> b #

foldr' :: (a -> b -> b) -> b -> JsxSelfClosingElement a -> b #

foldl :: (b -> a -> b) -> b -> JsxSelfClosingElement a -> b #

foldl' :: (b -> a -> b) -> b -> JsxSelfClosingElement a -> b #

foldr1 :: (a -> a -> a) -> JsxSelfClosingElement a -> a #

foldl1 :: (a -> a -> a) -> JsxSelfClosingElement a -> a #

toList :: JsxSelfClosingElement a -> [a] #

null :: JsxSelfClosingElement a -> Bool #

length :: JsxSelfClosingElement a -> Int #

elem :: Eq a => a -> JsxSelfClosingElement a -> Bool #

maximum :: Ord a => JsxSelfClosingElement a -> a #

minimum :: Ord a => JsxSelfClosingElement a -> a #

sum :: Num a => JsxSelfClosingElement a -> a #

product :: Num a => JsxSelfClosingElement a -> a #

Traversable JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (JsxSelfClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxSelfClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxSelfClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxSelfClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxSelfClosingElement a) :: Type -> Type #

Generic1 JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxSelfClosingElement :: k -> Type #

Methods

from1 :: forall (a :: k). JsxSelfClosingElement a -> Rep1 JsxSelfClosingElement a #

to1 :: forall (a :: k). Rep1 JsxSelfClosingElement a -> JsxSelfClosingElement a #

type Rep (JsxSelfClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxSelfClosingElement a) = D1 ('MetaData "JsxSelfClosingElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxSelfClosingElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "attribute") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(JsxAttribute :+: JsxExpression) a]) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: (JsxNamespaceName :+: NestedIdentifier)) a)))))
type Rep1 JsxSelfClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 JsxSelfClosingElement = D1 ('MetaData "JsxSelfClosingElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxSelfClosingElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "attribute") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (JsxAttribute :+: JsxExpression)) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Identifier :+: (JsxNamespaceName :+: NestedIdentifier))))))

data JsxOpeningElement a Source #

Instances

Instances details
Functor JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxOpeningElement m -> m #

foldMap :: Monoid m => (a -> m) -> JsxOpeningElement a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxOpeningElement a -> m #

foldr :: (a -> b -> b) -> b -> JsxOpeningElement a -> b #

foldr' :: (a -> b -> b) -> b -> JsxOpeningElement a -> b #

foldl :: (b -> a -> b) -> b -> JsxOpeningElement a -> b #

foldl' :: (b -> a -> b) -> b -> JsxOpeningElement a -> b #

foldr1 :: (a -> a -> a) -> JsxOpeningElement a -> a #

foldl1 :: (a -> a -> a) -> JsxOpeningElement a -> a #

toList :: JsxOpeningElement a -> [a] #

null :: JsxOpeningElement a -> Bool #

length :: JsxOpeningElement a -> Int #

elem :: Eq a => a -> JsxOpeningElement a -> Bool #

maximum :: Ord a => JsxOpeningElement a -> a #

minimum :: Ord a => JsxOpeningElement a -> a #

sum :: Num a => JsxOpeningElement a -> a #

product :: Num a => JsxOpeningElement a -> a #

Traversable JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxOpeningElement a -> f (JsxOpeningElement b) #

sequenceA :: Applicative f => JsxOpeningElement (f a) -> f (JsxOpeningElement a) #

mapM :: Monad m => (a -> m b) -> JsxOpeningElement a -> m (JsxOpeningElement b) #

sequence :: Monad m => JsxOpeningElement (m a) -> m (JsxOpeningElement a) #

SymbolMatching JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (JsxOpeningElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxOpeningElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxOpeningElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxOpeningElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxOpeningElement a) :: Type -> Type #

Generic1 JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxOpeningElement :: k -> Type #

Methods

from1 :: forall (a :: k). JsxOpeningElement a -> Rep1 JsxOpeningElement a #

to1 :: forall (a :: k). Rep1 JsxOpeningElement a -> JsxOpeningElement a #

type Rep (JsxOpeningElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxOpeningElement a) = D1 ('MetaData "JsxOpeningElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxOpeningElement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "attribute") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(JsxAttribute :+: JsxExpression) a])) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: (JsxNamespaceName :+: NestedIdentifier)) a)) :*: S1 ('MetaSel ('Just "typeArguments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeArguments a))))))
type Rep1 JsxOpeningElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data JsxNamespaceName a Source #

Constructors

JsxNamespaceName 

Fields

Instances

Instances details
Functor JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> JsxNamespaceName a -> JsxNamespaceName b #

(<$) :: a -> JsxNamespaceName b -> JsxNamespaceName a #

Foldable JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxNamespaceName m -> m #

foldMap :: Monoid m => (a -> m) -> JsxNamespaceName a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxNamespaceName a -> m #

foldr :: (a -> b -> b) -> b -> JsxNamespaceName a -> b #

foldr' :: (a -> b -> b) -> b -> JsxNamespaceName a -> b #

foldl :: (b -> a -> b) -> b -> JsxNamespaceName a -> b #

foldl' :: (b -> a -> b) -> b -> JsxNamespaceName a -> b #

foldr1 :: (a -> a -> a) -> JsxNamespaceName a -> a #

foldl1 :: (a -> a -> a) -> JsxNamespaceName a -> a #

toList :: JsxNamespaceName a -> [a] #

null :: JsxNamespaceName a -> Bool #

length :: JsxNamespaceName a -> Int #

elem :: Eq a => a -> JsxNamespaceName a -> Bool #

maximum :: Ord a => JsxNamespaceName a -> a #

minimum :: Ord a => JsxNamespaceName a -> a #

sum :: Num a => JsxNamespaceName a -> a #

product :: Num a => JsxNamespaceName a -> a #

Traversable JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxNamespaceName a -> f (JsxNamespaceName b) #

sequenceA :: Applicative f => JsxNamespaceName (f a) -> f (JsxNamespaceName a) #

mapM :: Monad m => (a -> m b) -> JsxNamespaceName a -> m (JsxNamespaceName b) #

sequence :: Monad m => JsxNamespaceName (m a) -> m (JsxNamespaceName a) #

SymbolMatching JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (JsxNamespaceName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxNamespaceName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxNamespaceName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxNamespaceName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxNamespaceName a) :: Type -> Type #

Generic1 JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxNamespaceName :: k -> Type #

Methods

from1 :: forall (a :: k). JsxNamespaceName a -> Rep1 JsxNamespaceName a #

to1 :: forall (a :: k). Rep1 JsxNamespaceName a -> JsxNamespaceName a #

type Rep (JsxNamespaceName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxNamespaceName a) = D1 ('MetaData "JsxNamespaceName" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxNamespaceName" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Identifier a)))))
type Rep1 JsxNamespaceName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 JsxNamespaceName = D1 ('MetaData "JsxNamespaceName" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxNamespaceName" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 Identifier)))

data JsxFragment a Source #

Instances

Instances details
Functor JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> JsxFragment a -> JsxFragment b #

(<$) :: a -> JsxFragment b -> JsxFragment a #

Foldable JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxFragment m -> m #

foldMap :: Monoid m => (a -> m) -> JsxFragment a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxFragment a -> m #

foldr :: (a -> b -> b) -> b -> JsxFragment a -> b #

foldr' :: (a -> b -> b) -> b -> JsxFragment a -> b #

foldl :: (b -> a -> b) -> b -> JsxFragment a -> b #

foldl' :: (b -> a -> b) -> b -> JsxFragment a -> b #

foldr1 :: (a -> a -> a) -> JsxFragment a -> a #

foldl1 :: (a -> a -> a) -> JsxFragment a -> a #

toList :: JsxFragment a -> [a] #

null :: JsxFragment a -> Bool #

length :: JsxFragment a -> Int #

elem :: Eq a => a -> JsxFragment a -> Bool #

maximum :: Ord a => JsxFragment a -> a #

minimum :: Ord a => JsxFragment a -> a #

sum :: Num a => JsxFragment a -> a #

product :: Num a => JsxFragment a -> a #

Traversable JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxFragment a -> f (JsxFragment b) #

sequenceA :: Applicative f => JsxFragment (f a) -> f (JsxFragment a) #

mapM :: Monad m => (a -> m b) -> JsxFragment a -> m (JsxFragment b) #

sequence :: Monad m => JsxFragment (m a) -> m (JsxFragment a) #

SymbolMatching JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match JsxFragment)

matchers :: B (Int, Match JsxFragment)

Eq a => Eq (JsxFragment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxFragment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxFragment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxFragment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxFragment a) :: Type -> Type #

Methods

from :: JsxFragment a -> Rep (JsxFragment a) x #

to :: Rep (JsxFragment a) x -> JsxFragment a #

Generic1 JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxFragment :: k -> Type #

Methods

from1 :: forall (a :: k). JsxFragment a -> Rep1 JsxFragment a #

to1 :: forall (a :: k). Rep1 JsxFragment a -> JsxFragment a #

type Rep (JsxFragment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxFragment a) = D1 ('MetaData "JsxFragment" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxFragment" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((JsxElement :+: JsxExpression) :+: (JsxSelfClosingElement :+: JsxText)) a])))
type Rep1 JsxFragment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 JsxFragment = D1 ('MetaData "JsxFragment" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxFragment" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ((JsxElement :+: JsxExpression) :+: (JsxSelfClosingElement :+: JsxText)))))

data JsxExpression a Source #

Instances

Instances details
Functor JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> JsxExpression a -> JsxExpression b #

(<$) :: a -> JsxExpression b -> JsxExpression a #

Foldable JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxExpression m -> m #

foldMap :: Monoid m => (a -> m) -> JsxExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxExpression a -> m #

foldr :: (a -> b -> b) -> b -> JsxExpression a -> b #

foldr' :: (a -> b -> b) -> b -> JsxExpression a -> b #

foldl :: (b -> a -> b) -> b -> JsxExpression a -> b #

foldl' :: (b -> a -> b) -> b -> JsxExpression a -> b #

foldr1 :: (a -> a -> a) -> JsxExpression a -> a #

foldl1 :: (a -> a -> a) -> JsxExpression a -> a #

toList :: JsxExpression a -> [a] #

null :: JsxExpression a -> Bool #

length :: JsxExpression a -> Int #

elem :: Eq a => a -> JsxExpression a -> Bool #

maximum :: Ord a => JsxExpression a -> a #

minimum :: Ord a => JsxExpression a -> a #

sum :: Num a => JsxExpression a -> a #

product :: Num a => JsxExpression a -> a #

Traversable JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxExpression a -> f (JsxExpression b) #

sequenceA :: Applicative f => JsxExpression (f a) -> f (JsxExpression a) #

mapM :: Monad m => (a -> m b) -> JsxExpression a -> m (JsxExpression b) #

sequence :: Monad m => JsxExpression (m a) -> m (JsxExpression a) #

SymbolMatching JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match JsxExpression)

matchers :: B (Int, Match JsxExpression)

Eq a => Eq (JsxExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxExpression a) :: Type -> Type #

Generic1 JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxExpression :: k -> Type #

Methods

from1 :: forall (a :: k). JsxExpression a -> Rep1 JsxExpression a #

to1 :: forall (a :: k). Rep1 JsxExpression a -> JsxExpression a #

type Rep (JsxExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxExpression a) = D1 ('MetaData "JsxExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ((Expression :+: (SequenceExpression :+: SpreadElement)) a)))))
type Rep1 JsxExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 JsxExpression = D1 ('MetaData "JsxExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 (Expression :+: (SequenceExpression :+: SpreadElement)))))

data JsxElement a Source #

Instances

Instances details
Functor JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> JsxElement a -> JsxElement b #

(<$) :: a -> JsxElement b -> JsxElement a #

Foldable JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxElement m -> m #

foldMap :: Monoid m => (a -> m) -> JsxElement a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxElement a -> m #

foldr :: (a -> b -> b) -> b -> JsxElement a -> b #

foldr' :: (a -> b -> b) -> b -> JsxElement a -> b #

foldl :: (b -> a -> b) -> b -> JsxElement a -> b #

foldl' :: (b -> a -> b) -> b -> JsxElement a -> b #

foldr1 :: (a -> a -> a) -> JsxElement a -> a #

foldl1 :: (a -> a -> a) -> JsxElement a -> a #

toList :: JsxElement a -> [a] #

null :: JsxElement a -> Bool #

length :: JsxElement a -> Int #

elem :: Eq a => a -> JsxElement a -> Bool #

maximum :: Ord a => JsxElement a -> a #

minimum :: Ord a => JsxElement a -> a #

sum :: Num a => JsxElement a -> a #

product :: Num a => JsxElement a -> a #

Traversable JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxElement a -> f (JsxElement b) #

sequenceA :: Applicative f => JsxElement (f a) -> f (JsxElement a) #

mapM :: Monad m => (a -> m b) -> JsxElement a -> m (JsxElement b) #

sequence :: Monad m => JsxElement (m a) -> m (JsxElement a) #

SymbolMatching JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match JsxElement)

matchers :: B (Int, Match JsxElement)

Eq a => Eq (JsxElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: JsxElement a -> JsxElement a -> Bool #

(/=) :: JsxElement a -> JsxElement a -> Bool #

Ord a => Ord (JsxElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxElement a) :: Type -> Type #

Methods

from :: JsxElement a -> Rep (JsxElement a) x #

to :: Rep (JsxElement a) x -> JsxElement a #

Generic1 JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxElement :: k -> Type #

Methods

from1 :: forall (a :: k). JsxElement a -> Rep1 JsxElement a #

to1 :: forall (a :: k). Rep1 JsxElement a -> JsxElement a #

type Rep (JsxElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxElement a) = D1 ('MetaData "JsxElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxElement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "closeTag") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (JsxClosingElement a))) :*: (S1 ('MetaSel ('Just "openTag") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (JsxOpeningElement a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((JsxElement :+: JsxExpression) :+: (JsxSelfClosingElement :+: JsxText)) a]))))
type Rep1 JsxElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data JsxClosingElement a Source #

Instances

Instances details
Functor JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxClosingElement m -> m #

foldMap :: Monoid m => (a -> m) -> JsxClosingElement a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxClosingElement a -> m #

foldr :: (a -> b -> b) -> b -> JsxClosingElement a -> b #

foldr' :: (a -> b -> b) -> b -> JsxClosingElement a -> b #

foldl :: (b -> a -> b) -> b -> JsxClosingElement a -> b #

foldl' :: (b -> a -> b) -> b -> JsxClosingElement a -> b #

foldr1 :: (a -> a -> a) -> JsxClosingElement a -> a #

foldl1 :: (a -> a -> a) -> JsxClosingElement a -> a #

toList :: JsxClosingElement a -> [a] #

null :: JsxClosingElement a -> Bool #

length :: JsxClosingElement a -> Int #

elem :: Eq a => a -> JsxClosingElement a -> Bool #

maximum :: Ord a => JsxClosingElement a -> a #

minimum :: Ord a => JsxClosingElement a -> a #

sum :: Num a => JsxClosingElement a -> a #

product :: Num a => JsxClosingElement a -> a #

Traversable JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxClosingElement a -> f (JsxClosingElement b) #

sequenceA :: Applicative f => JsxClosingElement (f a) -> f (JsxClosingElement a) #

mapM :: Monad m => (a -> m b) -> JsxClosingElement a -> m (JsxClosingElement b) #

sequence :: Monad m => JsxClosingElement (m a) -> m (JsxClosingElement a) #

SymbolMatching JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (JsxClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxClosingElement a) :: Type -> Type #

Generic1 JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxClosingElement :: k -> Type #

Methods

from1 :: forall (a :: k). JsxClosingElement a -> Rep1 JsxClosingElement a #

to1 :: forall (a :: k). Rep1 JsxClosingElement a -> JsxClosingElement a #

type Rep (JsxClosingElement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxClosingElement a) = D1 ('MetaData "JsxClosingElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxClosingElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: (JsxNamespaceName :+: NestedIdentifier)) a))))
type Rep1 JsxClosingElement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 JsxClosingElement = D1 ('MetaData "JsxClosingElement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxClosingElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Identifier :+: (JsxNamespaceName :+: NestedIdentifier)))))

data JsxAttribute a Source #

Instances

Instances details
Functor JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> JsxAttribute a -> JsxAttribute b #

(<$) :: a -> JsxAttribute b -> JsxAttribute a #

Foldable JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => JsxAttribute m -> m #

foldMap :: Monoid m => (a -> m) -> JsxAttribute a -> m #

foldMap' :: Monoid m => (a -> m) -> JsxAttribute a -> m #

foldr :: (a -> b -> b) -> b -> JsxAttribute a -> b #

foldr' :: (a -> b -> b) -> b -> JsxAttribute a -> b #

foldl :: (b -> a -> b) -> b -> JsxAttribute a -> b #

foldl' :: (b -> a -> b) -> b -> JsxAttribute a -> b #

foldr1 :: (a -> a -> a) -> JsxAttribute a -> a #

foldl1 :: (a -> a -> a) -> JsxAttribute a -> a #

toList :: JsxAttribute a -> [a] #

null :: JsxAttribute a -> Bool #

length :: JsxAttribute a -> Int #

elem :: Eq a => a -> JsxAttribute a -> Bool #

maximum :: Ord a => JsxAttribute a -> a #

minimum :: Ord a => JsxAttribute a -> a #

sum :: Num a => JsxAttribute a -> a #

product :: Num a => JsxAttribute a -> a #

Traversable JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> JsxAttribute a -> f (JsxAttribute b) #

sequenceA :: Applicative f => JsxAttribute (f a) -> f (JsxAttribute a) #

mapM :: Monad m => (a -> m b) -> JsxAttribute a -> m (JsxAttribute b) #

sequence :: Monad m => JsxAttribute (m a) -> m (JsxAttribute a) #

SymbolMatching JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match JsxAttribute)

matchers :: B (Int, Match JsxAttribute)

Eq a => Eq (JsxAttribute a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (JsxAttribute a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (JsxAttribute a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (JsxAttribute a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (JsxAttribute a) :: Type -> Type #

Methods

from :: JsxAttribute a -> Rep (JsxAttribute a) x #

to :: Rep (JsxAttribute a) x -> JsxAttribute a #

Generic1 JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 JsxAttribute :: k -> Type #

Methods

from1 :: forall (a :: k). JsxAttribute a -> Rep1 JsxAttribute a #

to1 :: forall (a :: k). Rep1 JsxAttribute a -> JsxAttribute a #

type Rep (JsxAttribute a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (JsxAttribute a) = D1 ('MetaData "JsxAttribute" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxAttribute" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (((JsxElement :+: (JsxExpression :+: JsxFragment)) :+: ((JsxNamespaceName :+: JsxSelfClosingElement) :+: (PropertyIdentifier :+: String))) a)))))
type Rep1 JsxAttribute Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 JsxAttribute = D1 ('MetaData "JsxAttribute" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "JsxAttribute" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 ((JsxElement :+: (JsxExpression :+: JsxFragment)) :+: ((JsxNamespaceName :+: JsxSelfClosingElement) :+: (PropertyIdentifier :+: String))))))

data IntersectionType a Source #

Instances

Instances details
Functor IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> IntersectionType a -> IntersectionType b #

(<$) :: a -> IntersectionType b -> IntersectionType a #

Foldable IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => IntersectionType m -> m #

foldMap :: Monoid m => (a -> m) -> IntersectionType a -> m #

foldMap' :: Monoid m => (a -> m) -> IntersectionType a -> m #

foldr :: (a -> b -> b) -> b -> IntersectionType a -> b #

foldr' :: (a -> b -> b) -> b -> IntersectionType a -> b #

foldl :: (b -> a -> b) -> b -> IntersectionType a -> b #

foldl' :: (b -> a -> b) -> b -> IntersectionType a -> b #

foldr1 :: (a -> a -> a) -> IntersectionType a -> a #

foldl1 :: (a -> a -> a) -> IntersectionType a -> a #

toList :: IntersectionType a -> [a] #

null :: IntersectionType a -> Bool #

length :: IntersectionType a -> Int #

elem :: Eq a => a -> IntersectionType a -> Bool #

maximum :: Ord a => IntersectionType a -> a #

minimum :: Ord a => IntersectionType a -> a #

sum :: Num a => IntersectionType a -> a #

product :: Num a => IntersectionType a -> a #

Traversable IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> IntersectionType a -> f (IntersectionType b) #

sequenceA :: Applicative f => IntersectionType (f a) -> f (IntersectionType a) #

mapM :: Monad m => (a -> m b) -> IntersectionType a -> m (IntersectionType b) #

sequence :: Monad m => IntersectionType (m a) -> m (IntersectionType a) #

SymbolMatching IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (IntersectionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (IntersectionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (IntersectionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (IntersectionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (IntersectionType a) :: Type -> Type #

Generic1 IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 IntersectionType :: k -> Type #

Methods

from1 :: forall (a :: k). IntersectionType a -> Rep1 IntersectionType a #

to1 :: forall (a :: k). Rep1 IntersectionType a -> IntersectionType a #

type Rep (IntersectionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 IntersectionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data InternalModule a Source #

Instances

Instances details
Functor InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> InternalModule a -> InternalModule b #

(<$) :: a -> InternalModule b -> InternalModule a #

Foldable InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => InternalModule m -> m #

foldMap :: Monoid m => (a -> m) -> InternalModule a -> m #

foldMap' :: Monoid m => (a -> m) -> InternalModule a -> m #

foldr :: (a -> b -> b) -> b -> InternalModule a -> b #

foldr' :: (a -> b -> b) -> b -> InternalModule a -> b #

foldl :: (b -> a -> b) -> b -> InternalModule a -> b #

foldl' :: (b -> a -> b) -> b -> InternalModule a -> b #

foldr1 :: (a -> a -> a) -> InternalModule a -> a #

foldl1 :: (a -> a -> a) -> InternalModule a -> a #

toList :: InternalModule a -> [a] #

null :: InternalModule a -> Bool #

length :: InternalModule a -> Int #

elem :: Eq a => a -> InternalModule a -> Bool #

maximum :: Ord a => InternalModule a -> a #

minimum :: Ord a => InternalModule a -> a #

sum :: Num a => InternalModule a -> a #

product :: Num a => InternalModule a -> a #

Traversable InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> InternalModule a -> f (InternalModule b) #

sequenceA :: Applicative f => InternalModule (f a) -> f (InternalModule a) #

mapM :: Monad m => (a -> m b) -> InternalModule a -> m (InternalModule b) #

sequence :: Monad m => InternalModule (m a) -> m (InternalModule a) #

SymbolMatching InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match InternalModule)

matchers :: B (Int, Match InternalModule)

Eq a => Eq (InternalModule a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (InternalModule a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (InternalModule a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (InternalModule a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (InternalModule a) :: Type -> Type #

Generic1 InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 InternalModule :: k -> Type #

Methods

from1 :: forall (a :: k). InternalModule a -> Rep1 InternalModule a #

to1 :: forall (a :: k). Rep1 InternalModule a -> InternalModule a #

type Rep (InternalModule a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (InternalModule a) = D1 ('MetaData "InternalModule" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "InternalModule" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (StatementBlock a))) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Identifier :+: (NestedIdentifier :+: String)) a)))))
type Rep1 InternalModule Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 InternalModule = D1 ('MetaData "InternalModule" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "InternalModule" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 StatementBlock) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Identifier :+: (NestedIdentifier :+: String))))))

data InterfaceDeclaration a Source #

Instances

Instances details
Functor InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => InterfaceDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> InterfaceDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> InterfaceDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> InterfaceDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> InterfaceDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> InterfaceDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> InterfaceDeclaration a -> b #

foldr1 :: (a -> a -> a) -> InterfaceDeclaration a -> a #

foldl1 :: (a -> a -> a) -> InterfaceDeclaration a -> a #

toList :: InterfaceDeclaration a -> [a] #

null :: InterfaceDeclaration a -> Bool #

length :: InterfaceDeclaration a -> Int #

elem :: Eq a => a -> InterfaceDeclaration a -> Bool #

maximum :: Ord a => InterfaceDeclaration a -> a #

minimum :: Ord a => InterfaceDeclaration a -> a #

sum :: Num a => InterfaceDeclaration a -> a #

product :: Num a => InterfaceDeclaration a -> a #

Traversable InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (InterfaceDeclaration a) :: Type -> Type #

Generic1 InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 InterfaceDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). InterfaceDeclaration a -> Rep1 InterfaceDeclaration a #

to1 :: forall (a :: k). Rep1 InterfaceDeclaration a -> InterfaceDeclaration a #

type Rep (InterfaceDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (InterfaceDeclaration a) = D1 ('MetaData "InterfaceDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "InterfaceDeclaration" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ObjectType a))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: (S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeParameters a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (ExtendsClause a)))))))
type Rep1 InterfaceDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data IndexTypeQuery a Source #

Instances

Instances details
Functor IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> IndexTypeQuery a -> IndexTypeQuery b #

(<$) :: a -> IndexTypeQuery b -> IndexTypeQuery a #

Foldable IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => IndexTypeQuery m -> m #

foldMap :: Monoid m => (a -> m) -> IndexTypeQuery a -> m #

foldMap' :: Monoid m => (a -> m) -> IndexTypeQuery a -> m #

foldr :: (a -> b -> b) -> b -> IndexTypeQuery a -> b #

foldr' :: (a -> b -> b) -> b -> IndexTypeQuery a -> b #

foldl :: (b -> a -> b) -> b -> IndexTypeQuery a -> b #

foldl' :: (b -> a -> b) -> b -> IndexTypeQuery a -> b #

foldr1 :: (a -> a -> a) -> IndexTypeQuery a -> a #

foldl1 :: (a -> a -> a) -> IndexTypeQuery a -> a #

toList :: IndexTypeQuery a -> [a] #

null :: IndexTypeQuery a -> Bool #

length :: IndexTypeQuery a -> Int #

elem :: Eq a => a -> IndexTypeQuery a -> Bool #

maximum :: Ord a => IndexTypeQuery a -> a #

minimum :: Ord a => IndexTypeQuery a -> a #

sum :: Num a => IndexTypeQuery a -> a #

product :: Num a => IndexTypeQuery a -> a #

Traversable IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> IndexTypeQuery a -> f (IndexTypeQuery b) #

sequenceA :: Applicative f => IndexTypeQuery (f a) -> f (IndexTypeQuery a) #

mapM :: Monad m => (a -> m b) -> IndexTypeQuery a -> m (IndexTypeQuery b) #

sequence :: Monad m => IndexTypeQuery (m a) -> m (IndexTypeQuery a) #

SymbolMatching IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match IndexTypeQuery)

matchers :: B (Int, Match IndexTypeQuery)

Eq a => Eq (IndexTypeQuery a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (IndexTypeQuery a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (IndexTypeQuery a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (IndexTypeQuery a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (IndexTypeQuery a) :: Type -> Type #

Generic1 IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 IndexTypeQuery :: k -> Type #

Methods

from1 :: forall (a :: k). IndexTypeQuery a -> Rep1 IndexTypeQuery a #

to1 :: forall (a :: k). Rep1 IndexTypeQuery a -> IndexTypeQuery a #

type Rep (IndexTypeQuery a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (IndexTypeQuery a) = D1 ('MetaData "IndexTypeQuery" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "IndexTypeQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((NestedTypeIdentifier :+: TypeIdentifier) a))))
type Rep1 IndexTypeQuery Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 IndexTypeQuery = D1 ('MetaData "IndexTypeQuery" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "IndexTypeQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (NestedTypeIdentifier :+: TypeIdentifier))))

data IndexSignature a Source #

Instances

Instances details
Functor IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> IndexSignature a -> IndexSignature b #

(<$) :: a -> IndexSignature b -> IndexSignature a #

Foldable IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => IndexSignature m -> m #

foldMap :: Monoid m => (a -> m) -> IndexSignature a -> m #

foldMap' :: Monoid m => (a -> m) -> IndexSignature a -> m #

foldr :: (a -> b -> b) -> b -> IndexSignature a -> b #

foldr' :: (a -> b -> b) -> b -> IndexSignature a -> b #

foldl :: (b -> a -> b) -> b -> IndexSignature a -> b #

foldl' :: (b -> a -> b) -> b -> IndexSignature a -> b #

foldr1 :: (a -> a -> a) -> IndexSignature a -> a #

foldl1 :: (a -> a -> a) -> IndexSignature a -> a #

toList :: IndexSignature a -> [a] #

null :: IndexSignature a -> Bool #

length :: IndexSignature a -> Int #

elem :: Eq a => a -> IndexSignature a -> Bool #

maximum :: Ord a => IndexSignature a -> a #

minimum :: Ord a => IndexSignature a -> a #

sum :: Num a => IndexSignature a -> a #

product :: Num a => IndexSignature a -> a #

Traversable IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> IndexSignature a -> f (IndexSignature b) #

sequenceA :: Applicative f => IndexSignature (f a) -> f (IndexSignature a) #

mapM :: Monad m => (a -> m b) -> IndexSignature a -> m (IndexSignature b) #

sequence :: Monad m => IndexSignature (m a) -> m (IndexSignature a) #

SymbolMatching IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match IndexSignature)

matchers :: B (Int, Match IndexSignature)

Eq a => Eq (IndexSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (IndexSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (IndexSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (IndexSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (IndexSignature a) :: Type -> Type #

Generic1 IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 IndexSignature :: k -> Type #

Methods

from1 :: forall (a :: k). IndexSignature a -> Rep1 IndexSignature a #

to1 :: forall (a :: k). Rep1 IndexSignature a -> IndexSignature a #

type Rep (IndexSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (IndexSignature a) = D1 ('MetaData "IndexSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "IndexSignature" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (((Identifier :+: MappedTypeClause) :+: (PredefinedType :+: TypeAnnotation)) a)))))
type Rep1 IndexSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 IndexSignature = D1 ('MetaData "IndexSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "IndexSignature" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 ((Identifier :+: MappedTypeClause) :+: (PredefinedType :+: TypeAnnotation)))))

data ImportStatement a Source #

Instances

Instances details
Functor ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ImportStatement a -> ImportStatement b #

(<$) :: a -> ImportStatement b -> ImportStatement a #

Foldable ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ImportStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ImportStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportStatement a -> m #

foldr :: (a -> b -> b) -> b -> ImportStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ImportStatement a -> b #

foldl :: (b -> a -> b) -> b -> ImportStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ImportStatement a -> b #

foldr1 :: (a -> a -> a) -> ImportStatement a -> a #

foldl1 :: (a -> a -> a) -> ImportStatement a -> a #

toList :: ImportStatement a -> [a] #

null :: ImportStatement a -> Bool #

length :: ImportStatement a -> Int #

elem :: Eq a => a -> ImportStatement a -> Bool #

maximum :: Ord a => ImportStatement a -> a #

minimum :: Ord a => ImportStatement a -> a #

sum :: Num a => ImportStatement a -> a #

product :: Num a => ImportStatement a -> a #

Traversable ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportStatement a -> f (ImportStatement b) #

sequenceA :: Applicative f => ImportStatement (f a) -> f (ImportStatement a) #

mapM :: Monad m => (a -> m b) -> ImportStatement a -> m (ImportStatement b) #

sequence :: Monad m => ImportStatement (m a) -> m (ImportStatement a) #

SymbolMatching ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ImportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ImportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ImportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ImportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ImportStatement a) :: Type -> Type #

Generic1 ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ImportStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ImportStatement a -> Rep1 ImportStatement a #

to1 :: forall (a :: k). Rep1 ImportStatement a -> ImportStatement a #

type Rep (ImportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ImportStatement a) = D1 ('MetaData "ImportStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (String a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((ImportClause :+: (ImportRequireClause :+: String)) a)))))
type Rep1 ImportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ImportStatement = D1 ('MetaData "ImportStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 String) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (ImportClause :+: (ImportRequireClause :+: String))))))

data ImportSpecifier a Source #

Constructors

ImportSpecifier 

Fields

Instances

Instances details
Functor ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ImportSpecifier a -> ImportSpecifier b #

(<$) :: a -> ImportSpecifier b -> ImportSpecifier a #

Foldable ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ImportSpecifier m -> m #

foldMap :: Monoid m => (a -> m) -> ImportSpecifier a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportSpecifier a -> m #

foldr :: (a -> b -> b) -> b -> ImportSpecifier a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpecifier a -> b #

foldl :: (b -> a -> b) -> b -> ImportSpecifier a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpecifier a -> b #

foldr1 :: (a -> a -> a) -> ImportSpecifier a -> a #

foldl1 :: (a -> a -> a) -> ImportSpecifier a -> a #

toList :: ImportSpecifier a -> [a] #

null :: ImportSpecifier a -> Bool #

length :: ImportSpecifier a -> Int #

elem :: Eq a => a -> ImportSpecifier a -> Bool #

maximum :: Ord a => ImportSpecifier a -> a #

minimum :: Ord a => ImportSpecifier a -> a #

sum :: Num a => ImportSpecifier a -> a #

product :: Num a => ImportSpecifier a -> a #

Traversable ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpecifier a -> f (ImportSpecifier b) #

sequenceA :: Applicative f => ImportSpecifier (f a) -> f (ImportSpecifier a) #

mapM :: Monad m => (a -> m b) -> ImportSpecifier a -> m (ImportSpecifier b) #

sequence :: Monad m => ImportSpecifier (m a) -> m (ImportSpecifier a) #

SymbolMatching ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ImportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ImportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ImportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ImportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ImportSpecifier a) :: Type -> Type #

Generic1 ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ImportSpecifier :: k -> Type #

Methods

from1 :: forall (a :: k). ImportSpecifier a -> Rep1 ImportSpecifier a #

to1 :: forall (a :: k). Rep1 ImportSpecifier a -> ImportSpecifier a #

type Rep (ImportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ImportSpecifier a) = D1 ('MetaData "ImportSpecifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportSpecifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "alias") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Identifier a))) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identifier a)))))
type Rep1 ImportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ImportSpecifier = D1 ('MetaData "ImportSpecifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportSpecifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "alias") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 Identifier) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Identifier))))

data ImportRequireClause a Source #

Instances

Instances details
Functor ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ImportRequireClause m -> m #

foldMap :: Monoid m => (a -> m) -> ImportRequireClause a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportRequireClause a -> m #

foldr :: (a -> b -> b) -> b -> ImportRequireClause a -> b #

foldr' :: (a -> b -> b) -> b -> ImportRequireClause a -> b #

foldl :: (b -> a -> b) -> b -> ImportRequireClause a -> b #

foldl' :: (b -> a -> b) -> b -> ImportRequireClause a -> b #

foldr1 :: (a -> a -> a) -> ImportRequireClause a -> a #

foldl1 :: (a -> a -> a) -> ImportRequireClause a -> a #

toList :: ImportRequireClause a -> [a] #

null :: ImportRequireClause a -> Bool #

length :: ImportRequireClause a -> Int #

elem :: Eq a => a -> ImportRequireClause a -> Bool #

maximum :: Ord a => ImportRequireClause a -> a #

minimum :: Ord a => ImportRequireClause a -> a #

sum :: Num a => ImportRequireClause a -> a #

product :: Num a => ImportRequireClause a -> a #

Traversable ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ImportRequireClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ImportRequireClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ImportRequireClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ImportRequireClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ImportRequireClause a) :: Type -> Type #

Generic1 ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ImportRequireClause :: k -> Type #

Methods

from1 :: forall (a :: k). ImportRequireClause a -> Rep1 ImportRequireClause a #

to1 :: forall (a :: k). Rep1 ImportRequireClause a -> ImportRequireClause a #

type Rep (ImportRequireClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ImportRequireClause a) = D1 ('MetaData "ImportRequireClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportRequireClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Identifier :+: String) a)))))
type Rep1 ImportRequireClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ImportRequireClause = D1 ('MetaData "ImportRequireClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportRequireClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Identifier :+: String))))

data ImportClause a Source #

Instances

Instances details
Functor ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ImportClause a -> ImportClause b #

(<$) :: a -> ImportClause b -> ImportClause a #

Foldable ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ImportClause m -> m #

foldMap :: Monoid m => (a -> m) -> ImportClause a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportClause a -> m #

foldr :: (a -> b -> b) -> b -> ImportClause a -> b #

foldr' :: (a -> b -> b) -> b -> ImportClause a -> b #

foldl :: (b -> a -> b) -> b -> ImportClause a -> b #

foldl' :: (b -> a -> b) -> b -> ImportClause a -> b #

foldr1 :: (a -> a -> a) -> ImportClause a -> a #

foldl1 :: (a -> a -> a) -> ImportClause a -> a #

toList :: ImportClause a -> [a] #

null :: ImportClause a -> Bool #

length :: ImportClause a -> Int #

elem :: Eq a => a -> ImportClause a -> Bool #

maximum :: Ord a => ImportClause a -> a #

minimum :: Ord a => ImportClause a -> a #

sum :: Num a => ImportClause a -> a #

product :: Num a => ImportClause a -> a #

Traversable ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportClause a -> f (ImportClause b) #

sequenceA :: Applicative f => ImportClause (f a) -> f (ImportClause a) #

mapM :: Monad m => (a -> m b) -> ImportClause a -> m (ImportClause b) #

sequence :: Monad m => ImportClause (m a) -> m (ImportClause a) #

SymbolMatching ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ImportClause)

matchers :: B (Int, Match ImportClause)

Eq a => Eq (ImportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ImportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ImportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ImportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ImportClause a) :: Type -> Type #

Methods

from :: ImportClause a -> Rep (ImportClause a) x #

to :: Rep (ImportClause a) x -> ImportClause a #

Generic1 ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ImportClause :: k -> Type #

Methods

from1 :: forall (a :: k). ImportClause a -> Rep1 ImportClause a #

to1 :: forall (a :: k). Rep1 ImportClause a -> ImportClause a #

type Rep (ImportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ImportClause a) = D1 ('MetaData "ImportClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Identifier :+: (NamedImports :+: NamespaceImport)) a)))))
type Rep1 ImportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ImportClause = D1 ('MetaData "ImportClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Identifier :+: (NamedImports :+: NamespaceImport)))))

data ImportAlias a Source #

Instances

Instances details
Functor ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ImportAlias a -> ImportAlias b #

(<$) :: a -> ImportAlias b -> ImportAlias a #

Foldable ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ImportAlias m -> m #

foldMap :: Monoid m => (a -> m) -> ImportAlias a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportAlias a -> m #

foldr :: (a -> b -> b) -> b -> ImportAlias a -> b #

foldr' :: (a -> b -> b) -> b -> ImportAlias a -> b #

foldl :: (b -> a -> b) -> b -> ImportAlias a -> b #

foldl' :: (b -> a -> b) -> b -> ImportAlias a -> b #

foldr1 :: (a -> a -> a) -> ImportAlias a -> a #

foldl1 :: (a -> a -> a) -> ImportAlias a -> a #

toList :: ImportAlias a -> [a] #

null :: ImportAlias a -> Bool #

length :: ImportAlias a -> Int #

elem :: Eq a => a -> ImportAlias a -> Bool #

maximum :: Ord a => ImportAlias a -> a #

minimum :: Ord a => ImportAlias a -> a #

sum :: Num a => ImportAlias a -> a #

product :: Num a => ImportAlias a -> a #

Traversable ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportAlias a -> f (ImportAlias b) #

sequenceA :: Applicative f => ImportAlias (f a) -> f (ImportAlias a) #

mapM :: Monad m => (a -> m b) -> ImportAlias a -> m (ImportAlias b) #

sequence :: Monad m => ImportAlias (m a) -> m (ImportAlias a) #

SymbolMatching ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ImportAlias)

matchers :: B (Int, Match ImportAlias)

Eq a => Eq (ImportAlias a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ImportAlias a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ImportAlias a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ImportAlias a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ImportAlias a) :: Type -> Type #

Methods

from :: ImportAlias a -> Rep (ImportAlias a) x #

to :: Rep (ImportAlias a) x -> ImportAlias a #

Generic1 ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ImportAlias :: k -> Type #

Methods

from1 :: forall (a :: k). ImportAlias a -> Rep1 ImportAlias a #

to1 :: forall (a :: k). Rep1 ImportAlias a -> ImportAlias a #

type Rep (ImportAlias a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ImportAlias a) = D1 ('MetaData "ImportAlias" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportAlias" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Identifier :+: NestedIdentifier) a)))))
type Rep1 ImportAlias Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ImportAlias = D1 ('MetaData "ImportAlias" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ImportAlias" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Identifier :+: NestedIdentifier))))

data Import a Source #

Constructors

Import 

Fields

Instances

Instances details
Functor Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Import a -> Import b #

(<$) :: a -> Import b -> Import a #

Foldable Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Import m -> m #

foldMap :: Monoid m => (a -> m) -> Import a -> m #

foldMap' :: Monoid m => (a -> m) -> Import a -> m #

foldr :: (a -> b -> b) -> b -> Import a -> b #

foldr' :: (a -> b -> b) -> b -> Import a -> b #

foldl :: (b -> a -> b) -> b -> Import a -> b #

foldl' :: (b -> a -> b) -> b -> Import a -> b #

foldr1 :: (a -> a -> a) -> Import a -> a #

foldl1 :: (a -> a -> a) -> Import a -> a #

toList :: Import a -> [a] #

null :: Import a -> Bool #

length :: Import a -> Int #

elem :: Eq a => a -> Import a -> Bool #

maximum :: Ord a => Import a -> a #

minimum :: Ord a => Import a -> a #

sum :: Num a => Import a -> a #

product :: Num a => Import a -> a #

Traversable Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Import a -> f (Import b) #

sequenceA :: Applicative f => Import (f a) -> f (Import a) #

mapM :: Monad m => (a -> m b) -> Import a -> m (Import b) #

sequence :: Monad m => Import (m a) -> m (Import a) #

SymbolMatching Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Import)

matchers :: B (Int, Match Import)

Eq a => Eq (Import a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Import a -> Import a -> Bool #

(/=) :: Import a -> Import a -> Bool #

Ord a => Ord (Import a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Import a -> Import a -> Ordering #

(<) :: Import a -> Import a -> Bool #

(<=) :: Import a -> Import a -> Bool #

(>) :: Import a -> Import a -> Bool #

(>=) :: Import a -> Import a -> Bool #

max :: Import a -> Import a -> Import a #

min :: Import a -> Import a -> Import a #

Show a => Show (Import a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Import a -> ShowS #

show :: Import a -> String #

showList :: [Import a] -> ShowS #

Generic (Import a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Import a) :: Type -> Type #

Methods

from :: Import a -> Rep (Import a) x #

to :: Rep (Import a) x -> Import a #

Generic1 Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Import :: k -> Type #

Methods

from1 :: forall (a :: k). Import a -> Rep1 Import a #

to1 :: forall (a :: k). Rep1 Import a -> Import a #

type Rep (Import a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Import a) = D1 ('MetaData "Import" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Import" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 Import Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Import = D1 ('MetaData "Import" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Import" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data ImplementsClause a Source #

Instances

Instances details
Functor ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ImplementsClause a -> ImplementsClause b #

(<$) :: a -> ImplementsClause b -> ImplementsClause a #

Foldable ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ImplementsClause m -> m #

foldMap :: Monoid m => (a -> m) -> ImplementsClause a -> m #

foldMap' :: Monoid m => (a -> m) -> ImplementsClause a -> m #

foldr :: (a -> b -> b) -> b -> ImplementsClause a -> b #

foldr' :: (a -> b -> b) -> b -> ImplementsClause a -> b #

foldl :: (b -> a -> b) -> b -> ImplementsClause a -> b #

foldl' :: (b -> a -> b) -> b -> ImplementsClause a -> b #

foldr1 :: (a -> a -> a) -> ImplementsClause a -> a #

foldl1 :: (a -> a -> a) -> ImplementsClause a -> a #

toList :: ImplementsClause a -> [a] #

null :: ImplementsClause a -> Bool #

length :: ImplementsClause a -> Int #

elem :: Eq a => a -> ImplementsClause a -> Bool #

maximum :: Ord a => ImplementsClause a -> a #

minimum :: Ord a => ImplementsClause a -> a #

sum :: Num a => ImplementsClause a -> a #

product :: Num a => ImplementsClause a -> a #

Traversable ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImplementsClause a -> f (ImplementsClause b) #

sequenceA :: Applicative f => ImplementsClause (f a) -> f (ImplementsClause a) #

mapM :: Monad m => (a -> m b) -> ImplementsClause a -> m (ImplementsClause b) #

sequence :: Monad m => ImplementsClause (m a) -> m (ImplementsClause a) #

SymbolMatching ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ImplementsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ImplementsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ImplementsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ImplementsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ImplementsClause a) :: Type -> Type #

Generic1 ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ImplementsClause :: k -> Type #

Methods

from1 :: forall (a :: k). ImplementsClause a -> Rep1 ImplementsClause a #

to1 :: forall (a :: k). Rep1 ImplementsClause a -> ImplementsClause a #

type Rep (ImplementsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ImplementsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data IfStatement a Source #

Instances

Instances details
Functor IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> IfStatement a -> IfStatement b #

(<$) :: a -> IfStatement b -> IfStatement a #

Foldable IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => IfStatement m -> m #

foldMap :: Monoid m => (a -> m) -> IfStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> IfStatement a -> m #

foldr :: (a -> b -> b) -> b -> IfStatement a -> b #

foldr' :: (a -> b -> b) -> b -> IfStatement a -> b #

foldl :: (b -> a -> b) -> b -> IfStatement a -> b #

foldl' :: (b -> a -> b) -> b -> IfStatement a -> b #

foldr1 :: (a -> a -> a) -> IfStatement a -> a #

foldl1 :: (a -> a -> a) -> IfStatement a -> a #

toList :: IfStatement a -> [a] #

null :: IfStatement a -> Bool #

length :: IfStatement a -> Int #

elem :: Eq a => a -> IfStatement a -> Bool #

maximum :: Ord a => IfStatement a -> a #

minimum :: Ord a => IfStatement a -> a #

sum :: Num a => IfStatement a -> a #

product :: Num a => IfStatement a -> a #

Traversable IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> IfStatement a -> f (IfStatement b) #

sequenceA :: Applicative f => IfStatement (f a) -> f (IfStatement a) #

mapM :: Monad m => (a -> m b) -> IfStatement a -> m (IfStatement b) #

sequence :: Monad m => IfStatement (m a) -> m (IfStatement a) #

SymbolMatching IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match IfStatement)

matchers :: B (Int, Match IfStatement)

Eq a => Eq (IfStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (IfStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (IfStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (IfStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (IfStatement a) :: Type -> Type #

Methods

from :: IfStatement a -> Rep (IfStatement a) x #

to :: Rep (IfStatement a) x -> IfStatement a #

Generic1 IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 IfStatement :: k -> Type #

Methods

from1 :: forall (a :: k). IfStatement a -> Rep1 IfStatement a #

to1 :: forall (a :: k). Rep1 IfStatement a -> IfStatement a #

type Rep (IfStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (IfStatement a) = D1 ('MetaData "IfStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "IfStatement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "alternative") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Statement a)))) :*: (S1 ('MetaSel ('Just "consequence") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Statement a)) :*: S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ParenthesizedExpression a)))))
type Rep1 IfStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 IfStatement = D1 ('MetaData "IfStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "IfStatement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "alternative") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 Statement)) :*: (S1 ('MetaSel ('Just "consequence") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Statement) :*: S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ParenthesizedExpression))))

data GenericType a Source #

Instances

Instances details
Functor GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> GenericType a -> GenericType b #

(<$) :: a -> GenericType b -> GenericType a #

Foldable GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => GenericType m -> m #

foldMap :: Monoid m => (a -> m) -> GenericType a -> m #

foldMap' :: Monoid m => (a -> m) -> GenericType a -> m #

foldr :: (a -> b -> b) -> b -> GenericType a -> b #

foldr' :: (a -> b -> b) -> b -> GenericType a -> b #

foldl :: (b -> a -> b) -> b -> GenericType a -> b #

foldl' :: (b -> a -> b) -> b -> GenericType a -> b #

foldr1 :: (a -> a -> a) -> GenericType a -> a #

foldl1 :: (a -> a -> a) -> GenericType a -> a #

toList :: GenericType a -> [a] #

null :: GenericType a -> Bool #

length :: GenericType a -> Int #

elem :: Eq a => a -> GenericType a -> Bool #

maximum :: Ord a => GenericType a -> a #

minimum :: Ord a => GenericType a -> a #

sum :: Num a => GenericType a -> a #

product :: Num a => GenericType a -> a #

Traversable GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> GenericType a -> f (GenericType b) #

sequenceA :: Applicative f => GenericType (f a) -> f (GenericType a) #

mapM :: Monad m => (a -> m b) -> GenericType a -> m (GenericType b) #

sequence :: Monad m => GenericType (m a) -> m (GenericType a) #

SymbolMatching GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match GenericType)

matchers :: B (Int, Match GenericType)

Eq a => Eq (GenericType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (GenericType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (GenericType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (GenericType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (GenericType a) :: Type -> Type #

Methods

from :: GenericType a -> Rep (GenericType a) x #

to :: Rep (GenericType a) x -> GenericType a #

Generic1 GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 GenericType :: k -> Type #

Methods

from1 :: forall (a :: k). GenericType a -> Rep1 GenericType a #

to1 :: forall (a :: k). Rep1 GenericType a -> GenericType a #

type Rep (GenericType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (GenericType a) = D1 ('MetaData "GenericType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "GenericType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((NestedTypeIdentifier :+: (TypeArguments :+: TypeIdentifier)) a)))))
type Rep1 GenericType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 GenericType = D1 ('MetaData "GenericType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "GenericType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (NestedTypeIdentifier :+: (TypeArguments :+: TypeIdentifier)))))

data GeneratorFunctionDeclaration a Source #

Instances

Instances details
Functor GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Traversable GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (GeneratorFunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (GeneratorFunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (GeneratorFunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (GeneratorFunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (GeneratorFunctionDeclaration a) :: Type -> Type #

Generic1 GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 GeneratorFunctionDeclaration :: k -> Type #

type Rep (GeneratorFunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (GeneratorFunctionDeclaration a) = D1 ('MetaData "GeneratorFunctionDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "GeneratorFunctionDeclaration" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "returnType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeAnnotation a))) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (StatementBlock a)))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identifier a)) :*: (S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FormalParameters a)) :*: S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeParameters a)))))))
type Rep1 GeneratorFunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data GeneratorFunction a Source #

Instances

Instances details
Functor GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => GeneratorFunction m -> m #

foldMap :: Monoid m => (a -> m) -> GeneratorFunction a -> m #

foldMap' :: Monoid m => (a -> m) -> GeneratorFunction a -> m #

foldr :: (a -> b -> b) -> b -> GeneratorFunction a -> b #

foldr' :: (a -> b -> b) -> b -> GeneratorFunction a -> b #

foldl :: (b -> a -> b) -> b -> GeneratorFunction a -> b #

foldl' :: (b -> a -> b) -> b -> GeneratorFunction a -> b #

foldr1 :: (a -> a -> a) -> GeneratorFunction a -> a #

foldl1 :: (a -> a -> a) -> GeneratorFunction a -> a #

toList :: GeneratorFunction a -> [a] #

null :: GeneratorFunction a -> Bool #

length :: GeneratorFunction a -> Int #

elem :: Eq a => a -> GeneratorFunction a -> Bool #

maximum :: Ord a => GeneratorFunction a -> a #

minimum :: Ord a => GeneratorFunction a -> a #

sum :: Num a => GeneratorFunction a -> a #

product :: Num a => GeneratorFunction a -> a #

Traversable GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> GeneratorFunction a -> f (GeneratorFunction b) #

sequenceA :: Applicative f => GeneratorFunction (f a) -> f (GeneratorFunction a) #

mapM :: Monad m => (a -> m b) -> GeneratorFunction a -> m (GeneratorFunction b) #

sequence :: Monad m => GeneratorFunction (m a) -> m (GeneratorFunction a) #

SymbolMatching GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (GeneratorFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (GeneratorFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (GeneratorFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (GeneratorFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (GeneratorFunction a) :: Type -> Type #

Generic1 GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 GeneratorFunction :: k -> Type #

Methods

from1 :: forall (a :: k). GeneratorFunction a -> Rep1 GeneratorFunction a #

to1 :: forall (a :: k). Rep1 GeneratorFunction a -> GeneratorFunction a #

type Rep (GeneratorFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 GeneratorFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data FunctionType a Source #

Instances

Instances details
Functor FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> FunctionType a -> FunctionType b #

(<$) :: a -> FunctionType b -> FunctionType a #

Foldable FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => FunctionType m -> m #

foldMap :: Monoid m => (a -> m) -> FunctionType a -> m #

foldMap' :: Monoid m => (a -> m) -> FunctionType a -> m #

foldr :: (a -> b -> b) -> b -> FunctionType a -> b #

foldr' :: (a -> b -> b) -> b -> FunctionType a -> b #

foldl :: (b -> a -> b) -> b -> FunctionType a -> b #

foldl' :: (b -> a -> b) -> b -> FunctionType a -> b #

foldr1 :: (a -> a -> a) -> FunctionType a -> a #

foldl1 :: (a -> a -> a) -> FunctionType a -> a #

toList :: FunctionType a -> [a] #

null :: FunctionType a -> Bool #

length :: FunctionType a -> Int #

elem :: Eq a => a -> FunctionType a -> Bool #

maximum :: Ord a => FunctionType a -> a #

minimum :: Ord a => FunctionType a -> a #

sum :: Num a => FunctionType a -> a #

product :: Num a => FunctionType a -> a #

Traversable FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> FunctionType a -> f (FunctionType b) #

sequenceA :: Applicative f => FunctionType (f a) -> f (FunctionType a) #

mapM :: Monad m => (a -> m b) -> FunctionType a -> m (FunctionType b) #

sequence :: Monad m => FunctionType (m a) -> m (FunctionType a) #

SymbolMatching FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match FunctionType)

matchers :: B (Int, Match FunctionType)

Eq a => Eq (FunctionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (FunctionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (FunctionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (FunctionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (FunctionType a) :: Type -> Type #

Methods

from :: FunctionType a -> Rep (FunctionType a) x #

to :: Rep (FunctionType a) x -> FunctionType a #

Generic1 FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 FunctionType :: k -> Type #

Methods

from1 :: forall (a :: k). FunctionType a -> Rep1 FunctionType a #

to1 :: forall (a :: k). Rep1 FunctionType a -> FunctionType a #

type Rep (FunctionType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 FunctionType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data FunctionSignature a Source #

Instances

Instances details
Functor FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => FunctionSignature m -> m #

foldMap :: Monoid m => (a -> m) -> FunctionSignature a -> m #

foldMap' :: Monoid m => (a -> m) -> FunctionSignature a -> m #

foldr :: (a -> b -> b) -> b -> FunctionSignature a -> b #

foldr' :: (a -> b -> b) -> b -> FunctionSignature a -> b #

foldl :: (b -> a -> b) -> b -> FunctionSignature a -> b #

foldl' :: (b -> a -> b) -> b -> FunctionSignature a -> b #

foldr1 :: (a -> a -> a) -> FunctionSignature a -> a #

foldl1 :: (a -> a -> a) -> FunctionSignature a -> a #

toList :: FunctionSignature a -> [a] #

null :: FunctionSignature a -> Bool #

length :: FunctionSignature a -> Int #

elem :: Eq a => a -> FunctionSignature a -> Bool #

maximum :: Ord a => FunctionSignature a -> a #

minimum :: Ord a => FunctionSignature a -> a #

sum :: Num a => FunctionSignature a -> a #

product :: Num a => FunctionSignature a -> a #

Traversable FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> FunctionSignature a -> f (FunctionSignature b) #

sequenceA :: Applicative f => FunctionSignature (f a) -> f (FunctionSignature a) #

mapM :: Monad m => (a -> m b) -> FunctionSignature a -> m (FunctionSignature b) #

sequence :: Monad m => FunctionSignature (m a) -> m (FunctionSignature a) #

SymbolMatching FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (FunctionSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (FunctionSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (FunctionSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (FunctionSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (FunctionSignature a) :: Type -> Type #

Generic1 FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 FunctionSignature :: k -> Type #

Methods

from1 :: forall (a :: k). FunctionSignature a -> Rep1 FunctionSignature a #

to1 :: forall (a :: k). Rep1 FunctionSignature a -> FunctionSignature a #

type Rep (FunctionSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (FunctionSignature a) = D1 ('MetaData "FunctionSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "FunctionSignature" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "returnType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeAnnotation a)))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identifier a)) :*: (S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FormalParameters a)) :*: S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeParameters a)))))))
type Rep1 FunctionSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data FunctionDeclaration a Source #

Instances

Instances details
Functor FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => FunctionDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> FunctionDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> FunctionDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> FunctionDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> FunctionDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> FunctionDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> FunctionDeclaration a -> b #

foldr1 :: (a -> a -> a) -> FunctionDeclaration a -> a #

foldl1 :: (a -> a -> a) -> FunctionDeclaration a -> a #

toList :: FunctionDeclaration a -> [a] #

null :: FunctionDeclaration a -> Bool #

length :: FunctionDeclaration a -> Int #

elem :: Eq a => a -> FunctionDeclaration a -> Bool #

maximum :: Ord a => FunctionDeclaration a -> a #

minimum :: Ord a => FunctionDeclaration a -> a #

sum :: Num a => FunctionDeclaration a -> a #

product :: Num a => FunctionDeclaration a -> a #

Traversable FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (FunctionDeclaration a) :: Type -> Type #

Generic1 FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 FunctionDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). FunctionDeclaration a -> Rep1 FunctionDeclaration a #

to1 :: forall (a :: k). Rep1 FunctionDeclaration a -> FunctionDeclaration a #

type Rep (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data Function a Source #

Instances

Instances details
Functor Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Function a -> Function b #

(<$) :: a -> Function b -> Function a #

Foldable Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Function m -> m #

foldMap :: Monoid m => (a -> m) -> Function a -> m #

foldMap' :: Monoid m => (a -> m) -> Function a -> m #

foldr :: (a -> b -> b) -> b -> Function a -> b #

foldr' :: (a -> b -> b) -> b -> Function a -> b #

foldl :: (b -> a -> b) -> b -> Function a -> b #

foldl' :: (b -> a -> b) -> b -> Function a -> b #

foldr1 :: (a -> a -> a) -> Function a -> a #

foldl1 :: (a -> a -> a) -> Function a -> a #

toList :: Function a -> [a] #

null :: Function a -> Bool #

length :: Function a -> Int #

elem :: Eq a => a -> Function a -> Bool #

maximum :: Ord a => Function a -> a #

minimum :: Ord a => Function a -> a #

sum :: Num a => Function a -> a #

product :: Num a => Function a -> a #

Traversable Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Function a -> f (Function b) #

sequenceA :: Applicative f => Function (f a) -> f (Function a) #

mapM :: Monad m => (a -> m b) -> Function a -> m (Function b) #

sequence :: Monad m => Function (m a) -> m (Function a) #

SymbolMatching Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Function)

matchers :: B (Int, Match Function)

Eq a => Eq (Function a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Function a -> Function a -> Bool #

(/=) :: Function a -> Function a -> Bool #

Ord a => Ord (Function a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Function a -> Function a -> Ordering #

(<) :: Function a -> Function a -> Bool #

(<=) :: Function a -> Function a -> Bool #

(>) :: Function a -> Function a -> Bool #

(>=) :: Function a -> Function a -> Bool #

max :: Function a -> Function a -> Function a #

min :: Function a -> Function a -> Function a #

Show a => Show (Function a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Function a -> ShowS #

show :: Function a -> String #

showList :: [Function a] -> ShowS #

Generic (Function a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Function a) :: Type -> Type #

Methods

from :: Function a -> Rep (Function a) x #

to :: Rep (Function a) x -> Function a #

Generic1 Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Function :: k -> Type #

Methods

from1 :: forall (a :: k). Function a -> Rep1 Function a #

to1 :: forall (a :: k). Rep1 Function a -> Function a #

type Rep (Function a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Function Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data FormalParameters a Source #

Instances

Instances details
Functor FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> FormalParameters a -> FormalParameters b #

(<$) :: a -> FormalParameters b -> FormalParameters a #

Foldable FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => FormalParameters m -> m #

foldMap :: Monoid m => (a -> m) -> FormalParameters a -> m #

foldMap' :: Monoid m => (a -> m) -> FormalParameters a -> m #

foldr :: (a -> b -> b) -> b -> FormalParameters a -> b #

foldr' :: (a -> b -> b) -> b -> FormalParameters a -> b #

foldl :: (b -> a -> b) -> b -> FormalParameters a -> b #

foldl' :: (b -> a -> b) -> b -> FormalParameters a -> b #

foldr1 :: (a -> a -> a) -> FormalParameters a -> a #

foldl1 :: (a -> a -> a) -> FormalParameters a -> a #

toList :: FormalParameters a -> [a] #

null :: FormalParameters a -> Bool #

length :: FormalParameters a -> Int #

elem :: Eq a => a -> FormalParameters a -> Bool #

maximum :: Ord a => FormalParameters a -> a #

minimum :: Ord a => FormalParameters a -> a #

sum :: Num a => FormalParameters a -> a #

product :: Num a => FormalParameters a -> a #

Traversable FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> FormalParameters a -> f (FormalParameters b) #

sequenceA :: Applicative f => FormalParameters (f a) -> f (FormalParameters a) #

mapM :: Monad m => (a -> m b) -> FormalParameters a -> m (FormalParameters b) #

sequence :: Monad m => FormalParameters (m a) -> m (FormalParameters a) #

SymbolMatching FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (FormalParameters a) :: Type -> Type #

Generic1 FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 FormalParameters :: k -> Type #

Methods

from1 :: forall (a :: k). FormalParameters a -> Rep1 FormalParameters a #

to1 :: forall (a :: k). Rep1 FormalParameters a -> FormalParameters a #

type Rep (FormalParameters a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (FormalParameters a) = D1 ('MetaData "FormalParameters" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "FormalParameters" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "decorator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Decorator a]) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(OptionalParameter :+: (RequiredParameter :+: RestParameter)) a]))))
type Rep1 FormalParameters Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 FormalParameters = D1 ('MetaData "FormalParameters" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "FormalParameters" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "decorator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Decorator) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (OptionalParameter :+: (RequiredParameter :+: RestParameter))))))

data ForStatement a Source #

Instances

Instances details
Functor ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ForStatement a -> ForStatement b #

(<$) :: a -> ForStatement b -> ForStatement a #

Foldable ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ForStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ForStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ForStatement a -> m #

foldr :: (a -> b -> b) -> b -> ForStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ForStatement a -> b #

foldl :: (b -> a -> b) -> b -> ForStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ForStatement a -> b #

foldr1 :: (a -> a -> a) -> ForStatement a -> a #

foldl1 :: (a -> a -> a) -> ForStatement a -> a #

toList :: ForStatement a -> [a] #

null :: ForStatement a -> Bool #

length :: ForStatement a -> Int #

elem :: Eq a => a -> ForStatement a -> Bool #

maximum :: Ord a => ForStatement a -> a #

minimum :: Ord a => ForStatement a -> a #

sum :: Num a => ForStatement a -> a #

product :: Num a => ForStatement a -> a #

Traversable ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ForStatement a -> f (ForStatement b) #

sequenceA :: Applicative f => ForStatement (f a) -> f (ForStatement a) #

mapM :: Monad m => (a -> m b) -> ForStatement a -> m (ForStatement b) #

sequence :: Monad m => ForStatement (m a) -> m (ForStatement a) #

SymbolMatching ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ForStatement)

matchers :: B (Int, Match ForStatement)

Eq a => Eq (ForStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ForStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ForStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ForStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ForStatement a) :: Type -> Type #

Methods

from :: ForStatement a -> Rep (ForStatement a) x #

to :: Rep (ForStatement a) x -> ForStatement a #

Generic1 ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ForStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ForStatement a -> Rep1 ForStatement a #

to1 :: forall (a :: k). Rep1 ForStatement a -> ForStatement a #

type Rep (ForStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ForStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ForInStatement a Source #

Instances

Instances details
Functor ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ForInStatement a -> ForInStatement b #

(<$) :: a -> ForInStatement b -> ForInStatement a #

Foldable ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ForInStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ForInStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ForInStatement a -> m #

foldr :: (a -> b -> b) -> b -> ForInStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ForInStatement a -> b #

foldl :: (b -> a -> b) -> b -> ForInStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ForInStatement a -> b #

foldr1 :: (a -> a -> a) -> ForInStatement a -> a #

foldl1 :: (a -> a -> a) -> ForInStatement a -> a #

toList :: ForInStatement a -> [a] #

null :: ForInStatement a -> Bool #

length :: ForInStatement a -> Int #

elem :: Eq a => a -> ForInStatement a -> Bool #

maximum :: Ord a => ForInStatement a -> a #

minimum :: Ord a => ForInStatement a -> a #

sum :: Num a => ForInStatement a -> a #

product :: Num a => ForInStatement a -> a #

Traversable ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ForInStatement a -> f (ForInStatement b) #

sequenceA :: Applicative f => ForInStatement (f a) -> f (ForInStatement a) #

mapM :: Monad m => (a -> m b) -> ForInStatement a -> m (ForInStatement b) #

sequence :: Monad m => ForInStatement (m a) -> m (ForInStatement a) #

SymbolMatching ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ForInStatement)

matchers :: B (Int, Match ForInStatement)

Eq a => Eq (ForInStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ForInStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ForInStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ForInStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ForInStatement a) :: Type -> Type #

Generic1 ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ForInStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ForInStatement a -> Rep1 ForInStatement a #

to1 :: forall (a :: k). Rep1 ForInStatement a -> ForInStatement a #

type Rep (ForInStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ForInStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data FlowMaybeType a Source #

Instances

Instances details
Functor FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> FlowMaybeType a -> FlowMaybeType b #

(<$) :: a -> FlowMaybeType b -> FlowMaybeType a #

Foldable FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => FlowMaybeType m -> m #

foldMap :: Monoid m => (a -> m) -> FlowMaybeType a -> m #

foldMap' :: Monoid m => (a -> m) -> FlowMaybeType a -> m #

foldr :: (a -> b -> b) -> b -> FlowMaybeType a -> b #

foldr' :: (a -> b -> b) -> b -> FlowMaybeType a -> b #

foldl :: (b -> a -> b) -> b -> FlowMaybeType a -> b #

foldl' :: (b -> a -> b) -> b -> FlowMaybeType a -> b #

foldr1 :: (a -> a -> a) -> FlowMaybeType a -> a #

foldl1 :: (a -> a -> a) -> FlowMaybeType a -> a #

toList :: FlowMaybeType a -> [a] #

null :: FlowMaybeType a -> Bool #

length :: FlowMaybeType a -> Int #

elem :: Eq a => a -> FlowMaybeType a -> Bool #

maximum :: Ord a => FlowMaybeType a -> a #

minimum :: Ord a => FlowMaybeType a -> a #

sum :: Num a => FlowMaybeType a -> a #

product :: Num a => FlowMaybeType a -> a #

Traversable FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> FlowMaybeType a -> f (FlowMaybeType b) #

sequenceA :: Applicative f => FlowMaybeType (f a) -> f (FlowMaybeType a) #

mapM :: Monad m => (a -> m b) -> FlowMaybeType a -> m (FlowMaybeType b) #

sequence :: Monad m => FlowMaybeType (m a) -> m (FlowMaybeType a) #

SymbolMatching FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match FlowMaybeType)

matchers :: B (Int, Match FlowMaybeType)

Eq a => Eq (FlowMaybeType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (FlowMaybeType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (FlowMaybeType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (FlowMaybeType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (FlowMaybeType a) :: Type -> Type #

Generic1 FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 FlowMaybeType :: k -> Type #

Methods

from1 :: forall (a :: k). FlowMaybeType a -> Rep1 FlowMaybeType a #

to1 :: forall (a :: k). Rep1 FlowMaybeType a -> FlowMaybeType a #

type Rep (FlowMaybeType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 FlowMaybeType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data FinallyClause a Source #

Constructors

FinallyClause 

Fields

Instances

Instances details
Functor FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> FinallyClause a -> FinallyClause b #

(<$) :: a -> FinallyClause b -> FinallyClause a #

Foldable FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => FinallyClause m -> m #

foldMap :: Monoid m => (a -> m) -> FinallyClause a -> m #

foldMap' :: Monoid m => (a -> m) -> FinallyClause a -> m #

foldr :: (a -> b -> b) -> b -> FinallyClause a -> b #

foldr' :: (a -> b -> b) -> b -> FinallyClause a -> b #

foldl :: (b -> a -> b) -> b -> FinallyClause a -> b #

foldl' :: (b -> a -> b) -> b -> FinallyClause a -> b #

foldr1 :: (a -> a -> a) -> FinallyClause a -> a #

foldl1 :: (a -> a -> a) -> FinallyClause a -> a #

toList :: FinallyClause a -> [a] #

null :: FinallyClause a -> Bool #

length :: FinallyClause a -> Int #

elem :: Eq a => a -> FinallyClause a -> Bool #

maximum :: Ord a => FinallyClause a -> a #

minimum :: Ord a => FinallyClause a -> a #

sum :: Num a => FinallyClause a -> a #

product :: Num a => FinallyClause a -> a #

Traversable FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> FinallyClause a -> f (FinallyClause b) #

sequenceA :: Applicative f => FinallyClause (f a) -> f (FinallyClause a) #

mapM :: Monad m => (a -> m b) -> FinallyClause a -> m (FinallyClause b) #

sequence :: Monad m => FinallyClause (m a) -> m (FinallyClause a) #

SymbolMatching FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match FinallyClause)

matchers :: B (Int, Match FinallyClause)

Eq a => Eq (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (FinallyClause a) :: Type -> Type #

Generic1 FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 FinallyClause :: k -> Type #

Methods

from1 :: forall (a :: k). FinallyClause a -> Rep1 FinallyClause a #

to1 :: forall (a :: k). Rep1 FinallyClause a -> FinallyClause a #

type Rep (FinallyClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (FinallyClause a) = D1 ('MetaData "FinallyClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "FinallyClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (StatementBlock a))))
type Rep1 FinallyClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 FinallyClause = D1 ('MetaData "FinallyClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "FinallyClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 StatementBlock)))

data ExtendsClause a Source #

Instances

Instances details
Functor ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ExtendsClause a -> ExtendsClause b #

(<$) :: a -> ExtendsClause b -> ExtendsClause a #

Foldable ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ExtendsClause m -> m #

foldMap :: Monoid m => (a -> m) -> ExtendsClause a -> m #

foldMap' :: Monoid m => (a -> m) -> ExtendsClause a -> m #

foldr :: (a -> b -> b) -> b -> ExtendsClause a -> b #

foldr' :: (a -> b -> b) -> b -> ExtendsClause a -> b #

foldl :: (b -> a -> b) -> b -> ExtendsClause a -> b #

foldl' :: (b -> a -> b) -> b -> ExtendsClause a -> b #

foldr1 :: (a -> a -> a) -> ExtendsClause a -> a #

foldl1 :: (a -> a -> a) -> ExtendsClause a -> a #

toList :: ExtendsClause a -> [a] #

null :: ExtendsClause a -> Bool #

length :: ExtendsClause a -> Int #

elem :: Eq a => a -> ExtendsClause a -> Bool #

maximum :: Ord a => ExtendsClause a -> a #

minimum :: Ord a => ExtendsClause a -> a #

sum :: Num a => ExtendsClause a -> a #

product :: Num a => ExtendsClause a -> a #

Traversable ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExtendsClause a -> f (ExtendsClause b) #

sequenceA :: Applicative f => ExtendsClause (f a) -> f (ExtendsClause a) #

mapM :: Monad m => (a -> m b) -> ExtendsClause a -> m (ExtendsClause b) #

sequence :: Monad m => ExtendsClause (m a) -> m (ExtendsClause a) #

SymbolMatching ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ExtendsClause)

matchers :: B (Int, Match ExtendsClause)

Eq a => Eq (ExtendsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ExtendsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ExtendsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ExtendsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ExtendsClause a) :: Type -> Type #

Generic1 ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ExtendsClause :: k -> Type #

Methods

from1 :: forall (a :: k). ExtendsClause a -> Rep1 ExtendsClause a #

to1 :: forall (a :: k). Rep1 ExtendsClause a -> ExtendsClause a #

type Rep (ExtendsClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ExtendsClause a) = D1 ('MetaData "ExtendsClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExtendsClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (((Expression :+: GenericType) :+: (NestedTypeIdentifier :+: TypeIdentifier)) a)))))
type Rep1 ExtendsClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ExtendsClause = D1 ('MetaData "ExtendsClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExtendsClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 ((Expression :+: GenericType) :+: (NestedTypeIdentifier :+: TypeIdentifier)))))

data ExpressionStatement a Source #

Instances

Instances details
Functor ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ExpressionStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ExpressionStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ExpressionStatement a -> m #

foldr :: (a -> b -> b) -> b -> ExpressionStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ExpressionStatement a -> b #

foldl :: (b -> a -> b) -> b -> ExpressionStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ExpressionStatement a -> b #

foldr1 :: (a -> a -> a) -> ExpressionStatement a -> a #

foldl1 :: (a -> a -> a) -> ExpressionStatement a -> a #

toList :: ExpressionStatement a -> [a] #

null :: ExpressionStatement a -> Bool #

length :: ExpressionStatement a -> Int #

elem :: Eq a => a -> ExpressionStatement a -> Bool #

maximum :: Ord a => ExpressionStatement a -> a #

minimum :: Ord a => ExpressionStatement a -> a #

sum :: Num a => ExpressionStatement a -> a #

product :: Num a => ExpressionStatement a -> a #

Traversable ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ExpressionStatement a) :: Type -> Type #

Generic1 ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ExpressionStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ExpressionStatement a -> Rep1 ExpressionStatement a #

to1 :: forall (a :: k). Rep1 ExpressionStatement a -> ExpressionStatement a #

type Rep (ExpressionStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ExpressionStatement a) = D1 ('MetaData "ExpressionStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: SequenceExpression) a))))
type Rep1 ExpressionStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ExpressionStatement = D1 ('MetaData "ExpressionStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: SequenceExpression))))

data ExportStatement a Source #

Instances

Instances details
Functor ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ExportStatement a -> ExportStatement b #

(<$) :: a -> ExportStatement b -> ExportStatement a #

Foldable ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ExportStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ExportStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ExportStatement a -> m #

foldr :: (a -> b -> b) -> b -> ExportStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ExportStatement a -> b #

foldl :: (b -> a -> b) -> b -> ExportStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ExportStatement a -> b #

foldr1 :: (a -> a -> a) -> ExportStatement a -> a #

foldl1 :: (a -> a -> a) -> ExportStatement a -> a #

toList :: ExportStatement a -> [a] #

null :: ExportStatement a -> Bool #

length :: ExportStatement a -> Int #

elem :: Eq a => a -> ExportStatement a -> Bool #

maximum :: Ord a => ExportStatement a -> a #

minimum :: Ord a => ExportStatement a -> a #

sum :: Num a => ExportStatement a -> a #

product :: Num a => ExportStatement a -> a #

Traversable ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExportStatement a -> f (ExportStatement b) #

sequenceA :: Applicative f => ExportStatement (f a) -> f (ExportStatement a) #

mapM :: Monad m => (a -> m b) -> ExportStatement a -> m (ExportStatement b) #

sequence :: Monad m => ExportStatement (m a) -> m (ExportStatement a) #

SymbolMatching ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ExportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ExportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ExportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ExportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ExportStatement a) :: Type -> Type #

Generic1 ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ExportStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ExportStatement a -> Rep1 ExportStatement a #

to1 :: forall (a :: k). Rep1 ExportStatement a -> ExportStatement a #

type Rep (ExportStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ExportStatement a) = D1 ('MetaData "ExportStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExportStatement" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "decorator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Decorator a]) :*: S1 ('MetaSel ('Just "declaration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Declaration a))))) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Expression a))) :*: (S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (String a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ((ExportClause :+: Identifier) a)))))))
type Rep1 ExportStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ExportSpecifier a Source #

Constructors

ExportSpecifier 

Fields

Instances

Instances details
Functor ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ExportSpecifier a -> ExportSpecifier b #

(<$) :: a -> ExportSpecifier b -> ExportSpecifier a #

Foldable ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ExportSpecifier m -> m #

foldMap :: Monoid m => (a -> m) -> ExportSpecifier a -> m #

foldMap' :: Monoid m => (a -> m) -> ExportSpecifier a -> m #

foldr :: (a -> b -> b) -> b -> ExportSpecifier a -> b #

foldr' :: (a -> b -> b) -> b -> ExportSpecifier a -> b #

foldl :: (b -> a -> b) -> b -> ExportSpecifier a -> b #

foldl' :: (b -> a -> b) -> b -> ExportSpecifier a -> b #

foldr1 :: (a -> a -> a) -> ExportSpecifier a -> a #

foldl1 :: (a -> a -> a) -> ExportSpecifier a -> a #

toList :: ExportSpecifier a -> [a] #

null :: ExportSpecifier a -> Bool #

length :: ExportSpecifier a -> Int #

elem :: Eq a => a -> ExportSpecifier a -> Bool #

maximum :: Ord a => ExportSpecifier a -> a #

minimum :: Ord a => ExportSpecifier a -> a #

sum :: Num a => ExportSpecifier a -> a #

product :: Num a => ExportSpecifier a -> a #

Traversable ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExportSpecifier a -> f (ExportSpecifier b) #

sequenceA :: Applicative f => ExportSpecifier (f a) -> f (ExportSpecifier a) #

mapM :: Monad m => (a -> m b) -> ExportSpecifier a -> m (ExportSpecifier b) #

sequence :: Monad m => ExportSpecifier (m a) -> m (ExportSpecifier a) #

SymbolMatching ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ExportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ExportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ExportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ExportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ExportSpecifier a) :: Type -> Type #

Generic1 ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ExportSpecifier :: k -> Type #

Methods

from1 :: forall (a :: k). ExportSpecifier a -> Rep1 ExportSpecifier a #

to1 :: forall (a :: k). Rep1 ExportSpecifier a -> ExportSpecifier a #

type Rep (ExportSpecifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ExportSpecifier a) = D1 ('MetaData "ExportSpecifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExportSpecifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "alias") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Identifier a))) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identifier a)))))
type Rep1 ExportSpecifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ExportSpecifier = D1 ('MetaData "ExportSpecifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExportSpecifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "alias") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 Identifier) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Identifier))))

data ExportClause a Source #

Constructors

ExportClause 

Fields

Instances

Instances details
Functor ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ExportClause a -> ExportClause b #

(<$) :: a -> ExportClause b -> ExportClause a #

Foldable ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ExportClause m -> m #

foldMap :: Monoid m => (a -> m) -> ExportClause a -> m #

foldMap' :: Monoid m => (a -> m) -> ExportClause a -> m #

foldr :: (a -> b -> b) -> b -> ExportClause a -> b #

foldr' :: (a -> b -> b) -> b -> ExportClause a -> b #

foldl :: (b -> a -> b) -> b -> ExportClause a -> b #

foldl' :: (b -> a -> b) -> b -> ExportClause a -> b #

foldr1 :: (a -> a -> a) -> ExportClause a -> a #

foldl1 :: (a -> a -> a) -> ExportClause a -> a #

toList :: ExportClause a -> [a] #

null :: ExportClause a -> Bool #

length :: ExportClause a -> Int #

elem :: Eq a => a -> ExportClause a -> Bool #

maximum :: Ord a => ExportClause a -> a #

minimum :: Ord a => ExportClause a -> a #

sum :: Num a => ExportClause a -> a #

product :: Num a => ExportClause a -> a #

Traversable ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExportClause a -> f (ExportClause b) #

sequenceA :: Applicative f => ExportClause (f a) -> f (ExportClause a) #

mapM :: Monad m => (a -> m b) -> ExportClause a -> m (ExportClause b) #

sequence :: Monad m => ExportClause (m a) -> m (ExportClause a) #

SymbolMatching ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ExportClause)

matchers :: B (Int, Match ExportClause)

Eq a => Eq (ExportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ExportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ExportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ExportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ExportClause a) :: Type -> Type #

Methods

from :: ExportClause a -> Rep (ExportClause a) x #

to :: Rep (ExportClause a) x -> ExportClause a #

Generic1 ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ExportClause :: k -> Type #

Methods

from1 :: forall (a :: k). ExportClause a -> Rep1 ExportClause a #

to1 :: forall (a :: k). Rep1 ExportClause a -> ExportClause a #

type Rep (ExportClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ExportClause a) = D1 ('MetaData "ExportClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExportClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ExportSpecifier a])))
type Rep1 ExportClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ExportClause = D1 ('MetaData "ExportClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExportClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ExportSpecifier)))

data ExistentialType a Source #

Constructors

ExistentialType 

Fields

Instances

Instances details
Functor ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ExistentialType a -> ExistentialType b #

(<$) :: a -> ExistentialType b -> ExistentialType a #

Foldable ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ExistentialType m -> m #

foldMap :: Monoid m => (a -> m) -> ExistentialType a -> m #

foldMap' :: Monoid m => (a -> m) -> ExistentialType a -> m #

foldr :: (a -> b -> b) -> b -> ExistentialType a -> b #

foldr' :: (a -> b -> b) -> b -> ExistentialType a -> b #

foldl :: (b -> a -> b) -> b -> ExistentialType a -> b #

foldl' :: (b -> a -> b) -> b -> ExistentialType a -> b #

foldr1 :: (a -> a -> a) -> ExistentialType a -> a #

foldl1 :: (a -> a -> a) -> ExistentialType a -> a #

toList :: ExistentialType a -> [a] #

null :: ExistentialType a -> Bool #

length :: ExistentialType a -> Int #

elem :: Eq a => a -> ExistentialType a -> Bool #

maximum :: Ord a => ExistentialType a -> a #

minimum :: Ord a => ExistentialType a -> a #

sum :: Num a => ExistentialType a -> a #

product :: Num a => ExistentialType a -> a #

Traversable ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExistentialType a -> f (ExistentialType b) #

sequenceA :: Applicative f => ExistentialType (f a) -> f (ExistentialType a) #

mapM :: Monad m => (a -> m b) -> ExistentialType a -> m (ExistentialType b) #

sequence :: Monad m => ExistentialType (m a) -> m (ExistentialType a) #

SymbolMatching ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ExistentialType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ExistentialType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ExistentialType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ExistentialType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ExistentialType a) :: Type -> Type #

Generic1 ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ExistentialType :: k -> Type #

Methods

from1 :: forall (a :: k). ExistentialType a -> Rep1 ExistentialType a #

to1 :: forall (a :: k). Rep1 ExistentialType a -> ExistentialType a #

type Rep (ExistentialType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ExistentialType a) = D1 ('MetaData "ExistentialType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExistentialType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 ExistentialType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ExistentialType = D1 ('MetaData "ExistentialType" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ExistentialType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data EnumDeclaration a Source #

Constructors

EnumDeclaration 

Fields

Instances

Instances details
Functor EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> EnumDeclaration a -> EnumDeclaration b #

(<$) :: a -> EnumDeclaration b -> EnumDeclaration a #

Foldable EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => EnumDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> EnumDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> EnumDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> EnumDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> EnumDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> EnumDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> EnumDeclaration a -> b #

foldr1 :: (a -> a -> a) -> EnumDeclaration a -> a #

foldl1 :: (a -> a -> a) -> EnumDeclaration a -> a #

toList :: EnumDeclaration a -> [a] #

null :: EnumDeclaration a -> Bool #

length :: EnumDeclaration a -> Int #

elem :: Eq a => a -> EnumDeclaration a -> Bool #

maximum :: Ord a => EnumDeclaration a -> a #

minimum :: Ord a => EnumDeclaration a -> a #

sum :: Num a => EnumDeclaration a -> a #

product :: Num a => EnumDeclaration a -> a #

Traversable EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> EnumDeclaration a -> f (EnumDeclaration b) #

sequenceA :: Applicative f => EnumDeclaration (f a) -> f (EnumDeclaration a) #

mapM :: Monad m => (a -> m b) -> EnumDeclaration a -> m (EnumDeclaration b) #

sequence :: Monad m => EnumDeclaration (m a) -> m (EnumDeclaration a) #

SymbolMatching EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (EnumDeclaration a) :: Type -> Type #

Generic1 EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 EnumDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). EnumDeclaration a -> Rep1 EnumDeclaration a #

to1 :: forall (a :: k). Rep1 EnumDeclaration a -> EnumDeclaration a #

type Rep (EnumDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (EnumDeclaration a) = D1 ('MetaData "EnumDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EnumDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (EnumBody a)) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Identifier a)))))
type Rep1 EnumDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 EnumDeclaration = D1 ('MetaData "EnumDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EnumDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 EnumBody) :*: S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Identifier))))

data EnumBody a Source #

Instances

Instances details
Functor EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> EnumBody a -> EnumBody b #

(<$) :: a -> EnumBody b -> EnumBody a #

Foldable EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => EnumBody m -> m #

foldMap :: Monoid m => (a -> m) -> EnumBody a -> m #

foldMap' :: Monoid m => (a -> m) -> EnumBody a -> m #

foldr :: (a -> b -> b) -> b -> EnumBody a -> b #

foldr' :: (a -> b -> b) -> b -> EnumBody a -> b #

foldl :: (b -> a -> b) -> b -> EnumBody a -> b #

foldl' :: (b -> a -> b) -> b -> EnumBody a -> b #

foldr1 :: (a -> a -> a) -> EnumBody a -> a #

foldl1 :: (a -> a -> a) -> EnumBody a -> a #

toList :: EnumBody a -> [a] #

null :: EnumBody a -> Bool #

length :: EnumBody a -> Int #

elem :: Eq a => a -> EnumBody a -> Bool #

maximum :: Ord a => EnumBody a -> a #

minimum :: Ord a => EnumBody a -> a #

sum :: Num a => EnumBody a -> a #

product :: Num a => EnumBody a -> a #

Traversable EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> EnumBody a -> f (EnumBody b) #

sequenceA :: Applicative f => EnumBody (f a) -> f (EnumBody a) #

mapM :: Monad m => (a -> m b) -> EnumBody a -> m (EnumBody b) #

sequence :: Monad m => EnumBody (m a) -> m (EnumBody a) #

SymbolMatching EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match EnumBody)

matchers :: B (Int, Match EnumBody)

Eq a => Eq (EnumBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: EnumBody a -> EnumBody a -> Bool #

(/=) :: EnumBody a -> EnumBody a -> Bool #

Ord a => Ord (EnumBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: EnumBody a -> EnumBody a -> Ordering #

(<) :: EnumBody a -> EnumBody a -> Bool #

(<=) :: EnumBody a -> EnumBody a -> Bool #

(>) :: EnumBody a -> EnumBody a -> Bool #

(>=) :: EnumBody a -> EnumBody a -> Bool #

max :: EnumBody a -> EnumBody a -> EnumBody a #

min :: EnumBody a -> EnumBody a -> EnumBody a #

Show a => Show (EnumBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> EnumBody a -> ShowS #

show :: EnumBody a -> String #

showList :: [EnumBody a] -> ShowS #

Generic (EnumBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (EnumBody a) :: Type -> Type #

Methods

from :: EnumBody a -> Rep (EnumBody a) x #

to :: Rep (EnumBody a) x -> EnumBody a #

Generic1 EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 EnumBody :: k -> Type #

Methods

from1 :: forall (a :: k). EnumBody a -> Rep1 EnumBody a #

to1 :: forall (a :: k). Rep1 EnumBody a -> EnumBody a #

type Rep (EnumBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (EnumBody a) = D1 ('MetaData "EnumBody" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EnumBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((ComputedPropertyName :+: EnumAssignment) :+: (Number :+: (PropertyIdentifier :+: String))) a])))
type Rep1 EnumBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 EnumBody = D1 ('MetaData "EnumBody" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EnumBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ((ComputedPropertyName :+: EnumAssignment) :+: (Number :+: (PropertyIdentifier :+: String))))))

data EnumAssignment a Source #

Instances

Instances details
Functor EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> EnumAssignment a -> EnumAssignment b #

(<$) :: a -> EnumAssignment b -> EnumAssignment a #

Foldable EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => EnumAssignment m -> m #

foldMap :: Monoid m => (a -> m) -> EnumAssignment a -> m #

foldMap' :: Monoid m => (a -> m) -> EnumAssignment a -> m #

foldr :: (a -> b -> b) -> b -> EnumAssignment a -> b #

foldr' :: (a -> b -> b) -> b -> EnumAssignment a -> b #

foldl :: (b -> a -> b) -> b -> EnumAssignment a -> b #

foldl' :: (b -> a -> b) -> b -> EnumAssignment a -> b #

foldr1 :: (a -> a -> a) -> EnumAssignment a -> a #

foldl1 :: (a -> a -> a) -> EnumAssignment a -> a #

toList :: EnumAssignment a -> [a] #

null :: EnumAssignment a -> Bool #

length :: EnumAssignment a -> Int #

elem :: Eq a => a -> EnumAssignment a -> Bool #

maximum :: Ord a => EnumAssignment a -> a #

minimum :: Ord a => EnumAssignment a -> a #

sum :: Num a => EnumAssignment a -> a #

product :: Num a => EnumAssignment a -> a #

Traversable EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> EnumAssignment a -> f (EnumAssignment b) #

sequenceA :: Applicative f => EnumAssignment (f a) -> f (EnumAssignment a) #

mapM :: Monad m => (a -> m b) -> EnumAssignment a -> m (EnumAssignment b) #

sequence :: Monad m => EnumAssignment (m a) -> m (EnumAssignment a) #

SymbolMatching EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match EnumAssignment)

matchers :: B (Int, Match EnumAssignment)

Eq a => Eq (EnumAssignment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (EnumAssignment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (EnumAssignment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (EnumAssignment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (EnumAssignment a) :: Type -> Type #

Generic1 EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 EnumAssignment :: k -> Type #

Methods

from1 :: forall (a :: k). EnumAssignment a -> Rep1 EnumAssignment a #

to1 :: forall (a :: k). Rep1 EnumAssignment a -> EnumAssignment a #

type Rep (EnumAssignment a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (EnumAssignment a) = D1 ('MetaData "EnumAssignment" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EnumAssignment" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((ComputedPropertyName :+: Number) :+: (PropertyIdentifier :+: String)) a)))))
type Rep1 EnumAssignment Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 EnumAssignment = D1 ('MetaData "EnumAssignment" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EnumAssignment" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ((ComputedPropertyName :+: Number) :+: (PropertyIdentifier :+: String))))))

data EmptyStatement a Source #

Constructors

EmptyStatement 

Fields

Instances

Instances details
Functor EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> EmptyStatement a -> EmptyStatement b #

(<$) :: a -> EmptyStatement b -> EmptyStatement a #

Foldable EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => EmptyStatement m -> m #

foldMap :: Monoid m => (a -> m) -> EmptyStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> EmptyStatement a -> m #

foldr :: (a -> b -> b) -> b -> EmptyStatement a -> b #

foldr' :: (a -> b -> b) -> b -> EmptyStatement a -> b #

foldl :: (b -> a -> b) -> b -> EmptyStatement a -> b #

foldl' :: (b -> a -> b) -> b -> EmptyStatement a -> b #

foldr1 :: (a -> a -> a) -> EmptyStatement a -> a #

foldl1 :: (a -> a -> a) -> EmptyStatement a -> a #

toList :: EmptyStatement a -> [a] #

null :: EmptyStatement a -> Bool #

length :: EmptyStatement a -> Int #

elem :: Eq a => a -> EmptyStatement a -> Bool #

maximum :: Ord a => EmptyStatement a -> a #

minimum :: Ord a => EmptyStatement a -> a #

sum :: Num a => EmptyStatement a -> a #

product :: Num a => EmptyStatement a -> a #

Traversable EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> EmptyStatement a -> f (EmptyStatement b) #

sequenceA :: Applicative f => EmptyStatement (f a) -> f (EmptyStatement a) #

mapM :: Monad m => (a -> m b) -> EmptyStatement a -> m (EmptyStatement b) #

sequence :: Monad m => EmptyStatement (m a) -> m (EmptyStatement a) #

SymbolMatching EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match EmptyStatement)

matchers :: B (Int, Match EmptyStatement)

Eq a => Eq (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (EmptyStatement a) :: Type -> Type #

Generic1 EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 EmptyStatement :: k -> Type #

Methods

from1 :: forall (a :: k). EmptyStatement a -> Rep1 EmptyStatement a #

to1 :: forall (a :: k). Rep1 EmptyStatement a -> EmptyStatement a #

type Rep (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (EmptyStatement a) = D1 ('MetaData "EmptyStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EmptyStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 EmptyStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 EmptyStatement = D1 ('MetaData "EmptyStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "EmptyStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data DoStatement a Source #

Constructors

DoStatement 

Fields

Instances

Instances details
Functor DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> DoStatement a -> DoStatement b #

(<$) :: a -> DoStatement b -> DoStatement a #

Foldable DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => DoStatement m -> m #

foldMap :: Monoid m => (a -> m) -> DoStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> DoStatement a -> m #

foldr :: (a -> b -> b) -> b -> DoStatement a -> b #

foldr' :: (a -> b -> b) -> b -> DoStatement a -> b #

foldl :: (b -> a -> b) -> b -> DoStatement a -> b #

foldl' :: (b -> a -> b) -> b -> DoStatement a -> b #

foldr1 :: (a -> a -> a) -> DoStatement a -> a #

foldl1 :: (a -> a -> a) -> DoStatement a -> a #

toList :: DoStatement a -> [a] #

null :: DoStatement a -> Bool #

length :: DoStatement a -> Int #

elem :: Eq a => a -> DoStatement a -> Bool #

maximum :: Ord a => DoStatement a -> a #

minimum :: Ord a => DoStatement a -> a #

sum :: Num a => DoStatement a -> a #

product :: Num a => DoStatement a -> a #

Traversable DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> DoStatement a -> f (DoStatement b) #

sequenceA :: Applicative f => DoStatement (f a) -> f (DoStatement a) #

mapM :: Monad m => (a -> m b) -> DoStatement a -> m (DoStatement b) #

sequence :: Monad m => DoStatement (m a) -> m (DoStatement a) #

SymbolMatching DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match DoStatement)

matchers :: B (Int, Match DoStatement)

Eq a => Eq (DoStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (DoStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (DoStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (DoStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (DoStatement a) :: Type -> Type #

Methods

from :: DoStatement a -> Rep (DoStatement a) x #

to :: Rep (DoStatement a) x -> DoStatement a #

Generic1 DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 DoStatement :: k -> Type #

Methods

from1 :: forall (a :: k). DoStatement a -> Rep1 DoStatement a #

to1 :: forall (a :: k). Rep1 DoStatement a -> DoStatement a #

type Rep (DoStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (DoStatement a) = D1 ('MetaData "DoStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "DoStatement" '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 DoStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 DoStatement = D1 ('MetaData "DoStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "DoStatement" '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 DefaultType a Source #

Instances

Instances details
Functor DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> DefaultType a -> DefaultType b #

(<$) :: a -> DefaultType b -> DefaultType a #

Foldable DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => DefaultType m -> m #

foldMap :: Monoid m => (a -> m) -> DefaultType a -> m #

foldMap' :: Monoid m => (a -> m) -> DefaultType a -> m #

foldr :: (a -> b -> b) -> b -> DefaultType a -> b #

foldr' :: (a -> b -> b) -> b -> DefaultType a -> b #

foldl :: (b -> a -> b) -> b -> DefaultType a -> b #

foldl' :: (b -> a -> b) -> b -> DefaultType a -> b #

foldr1 :: (a -> a -> a) -> DefaultType a -> a #

foldl1 :: (a -> a -> a) -> DefaultType a -> a #

toList :: DefaultType a -> [a] #

null :: DefaultType a -> Bool #

length :: DefaultType a -> Int #

elem :: Eq a => a -> DefaultType a -> Bool #

maximum :: Ord a => DefaultType a -> a #

minimum :: Ord a => DefaultType a -> a #

sum :: Num a => DefaultType a -> a #

product :: Num a => DefaultType a -> a #

Traversable DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> DefaultType a -> f (DefaultType b) #

sequenceA :: Applicative f => DefaultType (f a) -> f (DefaultType a) #

mapM :: Monad m => (a -> m b) -> DefaultType a -> m (DefaultType b) #

sequence :: Monad m => DefaultType (m a) -> m (DefaultType a) #

SymbolMatching DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match DefaultType)

matchers :: B (Int, Match DefaultType)

Eq a => Eq (DefaultType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (DefaultType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (DefaultType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (DefaultType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (DefaultType a) :: Type -> Type #

Methods

from :: DefaultType a -> Rep (DefaultType a) x #

to :: Rep (DefaultType a) x -> DefaultType a #

Generic1 DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 DefaultType :: k -> Type #

Methods

from1 :: forall (a :: k). DefaultType a -> Rep1 DefaultType a #

to1 :: forall (a :: k). Rep1 DefaultType a -> DefaultType a #

type Rep (DefaultType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 DefaultType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data Decorator a Source #

Instances

Instances details
Functor Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Decorator a -> Decorator b #

(<$) :: a -> Decorator b -> Decorator a #

Foldable Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Decorator m -> m #

foldMap :: Monoid m => (a -> m) -> Decorator a -> m #

foldMap' :: Monoid m => (a -> m) -> Decorator a -> m #

foldr :: (a -> b -> b) -> b -> Decorator a -> b #

foldr' :: (a -> b -> b) -> b -> Decorator a -> b #

foldl :: (b -> a -> b) -> b -> Decorator a -> b #

foldl' :: (b -> a -> b) -> b -> Decorator a -> b #

foldr1 :: (a -> a -> a) -> Decorator a -> a #

foldl1 :: (a -> a -> a) -> Decorator a -> a #

toList :: Decorator a -> [a] #

null :: Decorator a -> Bool #

length :: Decorator a -> Int #

elem :: Eq a => a -> Decorator a -> Bool #

maximum :: Ord a => Decorator a -> a #

minimum :: Ord a => Decorator a -> a #

sum :: Num a => Decorator a -> a #

product :: Num a => Decorator a -> a #

Traversable Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Decorator a -> f (Decorator b) #

sequenceA :: Applicative f => Decorator (f a) -> f (Decorator a) #

mapM :: Monad m => (a -> m b) -> Decorator a -> m (Decorator b) #

sequence :: Monad m => Decorator (m a) -> m (Decorator a) #

SymbolMatching Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Decorator)

matchers :: B (Int, Match Decorator)

Eq a => Eq (Decorator a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Decorator a -> Decorator a -> Bool #

(/=) :: Decorator a -> Decorator a -> Bool #

Ord a => Ord (Decorator a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (Decorator a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (Decorator a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Decorator a) :: Type -> Type #

Methods

from :: Decorator a -> Rep (Decorator a) x #

to :: Rep (Decorator a) x -> Decorator a #

Generic1 Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Decorator :: k -> Type #

Methods

from1 :: forall (a :: k). Decorator a -> Rep1 Decorator a #

to1 :: forall (a :: k). Rep1 Decorator a -> Decorator a #

type Rep (Decorator a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Decorator a) = D1 ('MetaData "Decorator" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Decorator" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((CallExpression :+: (Identifier :+: MemberExpression)) a))))
type Rep1 Decorator Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Decorator = D1 ('MetaData "Decorator" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Decorator" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (CallExpression :+: (Identifier :+: MemberExpression)))))

data DebuggerStatement a Source #

Constructors

DebuggerStatement 

Fields

Instances

Instances details
Functor DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => DebuggerStatement m -> m #

foldMap :: Monoid m => (a -> m) -> DebuggerStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> DebuggerStatement a -> m #

foldr :: (a -> b -> b) -> b -> DebuggerStatement a -> b #

foldr' :: (a -> b -> b) -> b -> DebuggerStatement a -> b #

foldl :: (b -> a -> b) -> b -> DebuggerStatement a -> b #

foldl' :: (b -> a -> b) -> b -> DebuggerStatement a -> b #

foldr1 :: (a -> a -> a) -> DebuggerStatement a -> a #

foldl1 :: (a -> a -> a) -> DebuggerStatement a -> a #

toList :: DebuggerStatement a -> [a] #

null :: DebuggerStatement a -> Bool #

length :: DebuggerStatement a -> Int #

elem :: Eq a => a -> DebuggerStatement a -> Bool #

maximum :: Ord a => DebuggerStatement a -> a #

minimum :: Ord a => DebuggerStatement a -> a #

sum :: Num a => DebuggerStatement a -> a #

product :: Num a => DebuggerStatement a -> a #

Traversable DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> DebuggerStatement a -> f (DebuggerStatement b) #

sequenceA :: Applicative f => DebuggerStatement (f a) -> f (DebuggerStatement a) #

mapM :: Monad m => (a -> m b) -> DebuggerStatement a -> m (DebuggerStatement b) #

sequence :: Monad m => DebuggerStatement (m a) -> m (DebuggerStatement a) #

SymbolMatching DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (DebuggerStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (DebuggerStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (DebuggerStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (DebuggerStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (DebuggerStatement a) :: Type -> Type #

Generic1 DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 DebuggerStatement :: k -> Type #

Methods

from1 :: forall (a :: k). DebuggerStatement a -> Rep1 DebuggerStatement a #

to1 :: forall (a :: k). Rep1 DebuggerStatement a -> DebuggerStatement a #

type Rep (DebuggerStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (DebuggerStatement a) = D1 ('MetaData "DebuggerStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "DebuggerStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 DebuggerStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 DebuggerStatement = D1 ('MetaData "DebuggerStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "DebuggerStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data ContinueStatement a Source #

Constructors

ContinueStatement 

Fields

Instances

Instances details
Functor ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ContinueStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ContinueStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ContinueStatement a -> m #

foldr :: (a -> b -> b) -> b -> ContinueStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ContinueStatement a -> b #

foldl :: (b -> a -> b) -> b -> ContinueStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ContinueStatement a -> b #

foldr1 :: (a -> a -> a) -> ContinueStatement a -> a #

foldl1 :: (a -> a -> a) -> ContinueStatement a -> a #

toList :: ContinueStatement a -> [a] #

null :: ContinueStatement a -> Bool #

length :: ContinueStatement a -> Int #

elem :: Eq a => a -> ContinueStatement a -> Bool #

maximum :: Ord a => ContinueStatement a -> a #

minimum :: Ord a => ContinueStatement a -> a #

sum :: Num a => ContinueStatement a -> a #

product :: Num a => ContinueStatement a -> a #

Traversable ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ContinueStatement a -> f (ContinueStatement b) #

sequenceA :: Applicative f => ContinueStatement (f a) -> f (ContinueStatement a) #

mapM :: Monad m => (a -> m b) -> ContinueStatement a -> m (ContinueStatement b) #

sequence :: Monad m => ContinueStatement (m a) -> m (ContinueStatement a) #

SymbolMatching ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ContinueStatement a) :: Type -> Type #

Generic1 ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ContinueStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ContinueStatement a -> Rep1 ContinueStatement a #

to1 :: forall (a :: k). Rep1 ContinueStatement a -> ContinueStatement a #

type Rep (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ContinueStatement a) = D1 ('MetaData "ContinueStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ContinueStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (StatementIdentifier a)))))
type Rep1 ContinueStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ContinueStatement = D1 ('MetaData "ContinueStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ContinueStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 StatementIdentifier)))

data ConstructorType a Source #

Instances

Instances details
Functor ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ConstructorType a -> ConstructorType b #

(<$) :: a -> ConstructorType b -> ConstructorType a #

Foldable ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ConstructorType m -> m #

foldMap :: Monoid m => (a -> m) -> ConstructorType a -> m #

foldMap' :: Monoid m => (a -> m) -> ConstructorType a -> m #

foldr :: (a -> b -> b) -> b -> ConstructorType a -> b #

foldr' :: (a -> b -> b) -> b -> ConstructorType a -> b #

foldl :: (b -> a -> b) -> b -> ConstructorType a -> b #

foldl' :: (b -> a -> b) -> b -> ConstructorType a -> b #

foldr1 :: (a -> a -> a) -> ConstructorType a -> a #

foldl1 :: (a -> a -> a) -> ConstructorType a -> a #

toList :: ConstructorType a -> [a] #

null :: ConstructorType a -> Bool #

length :: ConstructorType a -> Int #

elem :: Eq a => a -> ConstructorType a -> Bool #

maximum :: Ord a => ConstructorType a -> a #

minimum :: Ord a => ConstructorType a -> a #

sum :: Num a => ConstructorType a -> a #

product :: Num a => ConstructorType a -> a #

Traversable ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ConstructorType a -> f (ConstructorType b) #

sequenceA :: Applicative f => ConstructorType (f a) -> f (ConstructorType a) #

mapM :: Monad m => (a -> m b) -> ConstructorType a -> m (ConstructorType b) #

sequence :: Monad m => ConstructorType (m a) -> m (ConstructorType a) #

SymbolMatching ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ConstructorType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ConstructorType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ConstructorType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ConstructorType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ConstructorType a) :: Type -> Type #

Generic1 ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ConstructorType :: k -> Type #

Methods

from1 :: forall (a :: k). ConstructorType a -> Rep1 ConstructorType a #

to1 :: forall (a :: k). Rep1 ConstructorType a -> ConstructorType a #

type Rep (ConstructorType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ConstructorType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ConstructSignature a Source #

Instances

Instances details
Functor ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ConstructSignature m -> m #

foldMap :: Monoid m => (a -> m) -> ConstructSignature a -> m #

foldMap' :: Monoid m => (a -> m) -> ConstructSignature a -> m #

foldr :: (a -> b -> b) -> b -> ConstructSignature a -> b #

foldr' :: (a -> b -> b) -> b -> ConstructSignature a -> b #

foldl :: (b -> a -> b) -> b -> ConstructSignature a -> b #

foldl' :: (b -> a -> b) -> b -> ConstructSignature a -> b #

foldr1 :: (a -> a -> a) -> ConstructSignature a -> a #

foldl1 :: (a -> a -> a) -> ConstructSignature a -> a #

toList :: ConstructSignature a -> [a] #

null :: ConstructSignature a -> Bool #

length :: ConstructSignature a -> Int #

elem :: Eq a => a -> ConstructSignature a -> Bool #

maximum :: Ord a => ConstructSignature a -> a #

minimum :: Ord a => ConstructSignature a -> a #

sum :: Num a => ConstructSignature a -> a #

product :: Num a => ConstructSignature a -> a #

Traversable ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ConstructSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ConstructSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ConstructSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ConstructSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ConstructSignature a) :: Type -> Type #

Generic1 ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ConstructSignature :: k -> Type #

Methods

from1 :: forall (a :: k). ConstructSignature a -> Rep1 ConstructSignature a #

to1 :: forall (a :: k). Rep1 ConstructSignature a -> ConstructSignature a #

type Rep (ConstructSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ConstructSignature a) = D1 ('MetaData "ConstructSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ConstructSignature" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((FormalParameters :+: (TypeAnnotation :+: TypeParameters)) a)))))
type Rep1 ConstructSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ConstructSignature = D1 ('MetaData "ConstructSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ConstructSignature" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (FormalParameters :+: (TypeAnnotation :+: TypeParameters)))))

data Constraint a Source #

Instances

Instances details
Functor Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Constraint a -> Constraint b #

(<$) :: a -> Constraint b -> Constraint a #

Foldable Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Constraint m -> m #

foldMap :: Monoid m => (a -> m) -> Constraint a -> m #

foldMap' :: Monoid m => (a -> m) -> Constraint a -> m #

foldr :: (a -> b -> b) -> b -> Constraint a -> b #

foldr' :: (a -> b -> b) -> b -> Constraint a -> b #

foldl :: (b -> a -> b) -> b -> Constraint a -> b #

foldl' :: (b -> a -> b) -> b -> Constraint a -> b #

foldr1 :: (a -> a -> a) -> Constraint a -> a #

foldl1 :: (a -> a -> a) -> Constraint a -> a #

toList :: Constraint a -> [a] #

null :: Constraint a -> Bool #

length :: Constraint a -> Int #

elem :: Eq a => a -> Constraint a -> Bool #

maximum :: Ord a => Constraint a -> a #

minimum :: Ord a => Constraint a -> a #

sum :: Num a => Constraint a -> a #

product :: Num a => Constraint a -> a #

Traversable Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Constraint a -> f (Constraint b) #

sequenceA :: Applicative f => Constraint (f a) -> f (Constraint a) #

mapM :: Monad m => (a -> m b) -> Constraint a -> m (Constraint b) #

sequence :: Monad m => Constraint (m a) -> m (Constraint a) #

SymbolMatching Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Constraint)

matchers :: B (Int, Match Constraint)

Eq a => Eq (Constraint a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Constraint a -> Constraint a -> Bool #

(/=) :: Constraint a -> Constraint a -> Bool #

Ord a => Ord (Constraint a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (Constraint a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (Constraint a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Constraint a) :: Type -> Type #

Methods

from :: Constraint a -> Rep (Constraint a) x #

to :: Rep (Constraint a) x -> Constraint a #

Generic1 Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Constraint :: k -> Type #

Methods

from1 :: forall (a :: k). Constraint a -> Rep1 Constraint a #

to1 :: forall (a :: k). Rep1 Constraint a -> Constraint a #

type Rep (Constraint a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Constraint Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ComputedPropertyName a Source #

Constructors

ComputedPropertyName 

Fields

Instances

Instances details
Functor ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ComputedPropertyName m -> m #

foldMap :: Monoid m => (a -> m) -> ComputedPropertyName a -> m #

foldMap' :: Monoid m => (a -> m) -> ComputedPropertyName a -> m #

foldr :: (a -> b -> b) -> b -> ComputedPropertyName a -> b #

foldr' :: (a -> b -> b) -> b -> ComputedPropertyName a -> b #

foldl :: (b -> a -> b) -> b -> ComputedPropertyName a -> b #

foldl' :: (b -> a -> b) -> b -> ComputedPropertyName a -> b #

foldr1 :: (a -> a -> a) -> ComputedPropertyName a -> a #

foldl1 :: (a -> a -> a) -> ComputedPropertyName a -> a #

toList :: ComputedPropertyName a -> [a] #

null :: ComputedPropertyName a -> Bool #

length :: ComputedPropertyName a -> Int #

elem :: Eq a => a -> ComputedPropertyName a -> Bool #

maximum :: Ord a => ComputedPropertyName a -> a #

minimum :: Ord a => ComputedPropertyName a -> a #

sum :: Num a => ComputedPropertyName a -> a #

product :: Num a => ComputedPropertyName a -> a #

Traversable ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ComputedPropertyName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ComputedPropertyName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ComputedPropertyName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ComputedPropertyName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ComputedPropertyName a) :: Type -> Type #

Generic1 ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ComputedPropertyName :: k -> Type #

Methods

from1 :: forall (a :: k). ComputedPropertyName a -> Rep1 ComputedPropertyName a #

to1 :: forall (a :: k). Rep1 ComputedPropertyName a -> ComputedPropertyName a #

type Rep (ComputedPropertyName a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ComputedPropertyName a) = D1 ('MetaData "ComputedPropertyName" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ComputedPropertyName" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 ComputedPropertyName Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ComputedPropertyName = D1 ('MetaData "ComputedPropertyName" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ComputedPropertyName" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data ClassHeritage a Source #

Instances

Instances details
Functor ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ClassHeritage a -> ClassHeritage b #

(<$) :: a -> ClassHeritage b -> ClassHeritage a #

Foldable ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ClassHeritage m -> m #

foldMap :: Monoid m => (a -> m) -> ClassHeritage a -> m #

foldMap' :: Monoid m => (a -> m) -> ClassHeritage a -> m #

foldr :: (a -> b -> b) -> b -> ClassHeritage a -> b #

foldr' :: (a -> b -> b) -> b -> ClassHeritage a -> b #

foldl :: (b -> a -> b) -> b -> ClassHeritage a -> b #

foldl' :: (b -> a -> b) -> b -> ClassHeritage a -> b #

foldr1 :: (a -> a -> a) -> ClassHeritage a -> a #

foldl1 :: (a -> a -> a) -> ClassHeritage a -> a #

toList :: ClassHeritage a -> [a] #

null :: ClassHeritage a -> Bool #

length :: ClassHeritage a -> Int #

elem :: Eq a => a -> ClassHeritage a -> Bool #

maximum :: Ord a => ClassHeritage a -> a #

minimum :: Ord a => ClassHeritage a -> a #

sum :: Num a => ClassHeritage a -> a #

product :: Num a => ClassHeritage a -> a #

Traversable ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ClassHeritage a -> f (ClassHeritage b) #

sequenceA :: Applicative f => ClassHeritage (f a) -> f (ClassHeritage a) #

mapM :: Monad m => (a -> m b) -> ClassHeritage a -> m (ClassHeritage b) #

sequence :: Monad m => ClassHeritage (m a) -> m (ClassHeritage a) #

SymbolMatching ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ClassHeritage)

matchers :: B (Int, Match ClassHeritage)

Eq a => Eq (ClassHeritage a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ClassHeritage a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ClassHeritage a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ClassHeritage a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ClassHeritage a) :: Type -> Type #

Generic1 ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ClassHeritage :: k -> Type #

Methods

from1 :: forall (a :: k). ClassHeritage a -> Rep1 ClassHeritage a #

to1 :: forall (a :: k). Rep1 ClassHeritage a -> ClassHeritage a #

type Rep (ClassHeritage a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ClassHeritage a) = D1 ('MetaData "ClassHeritage" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ClassHeritage" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((ExtendsClause :+: ImplementsClause) a)))))
type Rep1 ClassHeritage Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ClassHeritage = D1 ('MetaData "ClassHeritage" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ClassHeritage" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (ExtendsClause :+: ImplementsClause))))

data ClassDeclaration a Source #

Constructors

ClassDeclaration 

Instances

Instances details
Functor ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ClassDeclaration a -> ClassDeclaration b #

(<$) :: a -> ClassDeclaration b -> ClassDeclaration a #

Foldable ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ClassDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ClassDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> ClassDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ClassDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ClassDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ClassDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ClassDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ClassDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ClassDeclaration a -> a #

toList :: ClassDeclaration a -> [a] #

null :: ClassDeclaration a -> Bool #

length :: ClassDeclaration a -> Int #

elem :: Eq a => a -> ClassDeclaration a -> Bool #

maximum :: Ord a => ClassDeclaration a -> a #

minimum :: Ord a => ClassDeclaration a -> a #

sum :: Num a => ClassDeclaration a -> a #

product :: Num a => ClassDeclaration a -> a #

Traversable ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ClassDeclaration a -> f (ClassDeclaration b) #

sequenceA :: Applicative f => ClassDeclaration (f a) -> f (ClassDeclaration a) #

mapM :: Monad m => (a -> m b) -> ClassDeclaration a -> m (ClassDeclaration b) #

sequence :: Monad m => ClassDeclaration (m a) -> m (ClassDeclaration a) #

SymbolMatching ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ClassDeclaration a) :: Type -> Type #

Generic1 ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ClassDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). ClassDeclaration a -> Rep1 ClassDeclaration a #

to1 :: forall (a :: k). Rep1 ClassDeclaration a -> ClassDeclaration a #

type Rep (ClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ClassDeclaration a) = D1 ('MetaData "ClassDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ClassDeclaration" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "decorator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Decorator a]) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ClassBody a)))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: (S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeParameters a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (ClassHeritage a)))))))
type Rep1 ClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ClassBody a Source #

Instances

Instances details
Functor ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ClassBody a -> ClassBody b #

(<$) :: a -> ClassBody b -> ClassBody a #

Foldable ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ClassBody m -> m #

foldMap :: Monoid m => (a -> m) -> ClassBody a -> m #

foldMap' :: Monoid m => (a -> m) -> ClassBody a -> m #

foldr :: (a -> b -> b) -> b -> ClassBody a -> b #

foldr' :: (a -> b -> b) -> b -> ClassBody a -> b #

foldl :: (b -> a -> b) -> b -> ClassBody a -> b #

foldl' :: (b -> a -> b) -> b -> ClassBody a -> b #

foldr1 :: (a -> a -> a) -> ClassBody a -> a #

foldl1 :: (a -> a -> a) -> ClassBody a -> a #

toList :: ClassBody a -> [a] #

null :: ClassBody a -> Bool #

length :: ClassBody a -> Int #

elem :: Eq a => a -> ClassBody a -> Bool #

maximum :: Ord a => ClassBody a -> a #

minimum :: Ord a => ClassBody a -> a #

sum :: Num a => ClassBody a -> a #

product :: Num a => ClassBody a -> a #

Traversable ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ClassBody a -> f (ClassBody b) #

sequenceA :: Applicative f => ClassBody (f a) -> f (ClassBody a) #

mapM :: Monad m => (a -> m b) -> ClassBody a -> m (ClassBody b) #

sequence :: Monad m => ClassBody (m a) -> m (ClassBody a) #

SymbolMatching ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ClassBody)

matchers :: B (Int, Match ClassBody)

Eq a => Eq (ClassBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: ClassBody a -> ClassBody a -> Bool #

(/=) :: ClassBody a -> ClassBody a -> Bool #

Ord a => Ord (ClassBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ClassBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ClassBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ClassBody a) :: Type -> Type #

Methods

from :: ClassBody a -> Rep (ClassBody a) x #

to :: Rep (ClassBody a) x -> ClassBody a #

Generic1 ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ClassBody :: k -> Type #

Methods

from1 :: forall (a :: k). ClassBody a -> Rep1 ClassBody a #

to1 :: forall (a :: k). Rep1 ClassBody a -> ClassBody a #

type Rep (ClassBody a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ClassBody a) = D1 ('MetaData "ClassBody" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ClassBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [((AbstractMethodSignature :+: (Decorator :+: IndexSignature)) :+: (MethodDefinition :+: (MethodSignature :+: PublicFieldDefinition))) a])))
type Rep1 ClassBody Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ClassBody = D1 ('MetaData "ClassBody" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ClassBody" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ((AbstractMethodSignature :+: (Decorator :+: IndexSignature)) :+: (MethodDefinition :+: (MethodSignature :+: PublicFieldDefinition))))))

data Class a Source #

Constructors

Class 

Instances

Instances details
Functor Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Class a -> Class b #

(<$) :: a -> Class b -> Class a #

Foldable Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Class m -> m #

foldMap :: Monoid m => (a -> m) -> Class a -> m #

foldMap' :: Monoid m => (a -> m) -> Class a -> m #

foldr :: (a -> b -> b) -> b -> Class a -> b #

foldr' :: (a -> b -> b) -> b -> Class a -> b #

foldl :: (b -> a -> b) -> b -> Class a -> b #

foldl' :: (b -> a -> b) -> b -> Class a -> b #

foldr1 :: (a -> a -> a) -> Class a -> a #

foldl1 :: (a -> a -> a) -> Class a -> a #

toList :: Class a -> [a] #

null :: Class a -> Bool #

length :: Class a -> Int #

elem :: Eq a => a -> Class a -> Bool #

maximum :: Ord a => Class a -> a #

minimum :: Ord a => Class a -> a #

sum :: Num a => Class a -> a #

product :: Num a => Class a -> a #

Traversable Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Class a -> f (Class b) #

sequenceA :: Applicative f => Class (f a) -> f (Class a) #

mapM :: Monad m => (a -> m b) -> Class a -> m (Class b) #

sequence :: Monad m => Class (m a) -> m (Class a) #

SymbolMatching Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Class)

matchers :: B (Int, Match Class)

Eq a => Eq (Class a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Class a -> Class a -> Bool #

(/=) :: Class a -> Class a -> Bool #

Ord a => Ord (Class a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Class a -> Class a -> Ordering #

(<) :: Class a -> Class a -> Bool #

(<=) :: Class a -> Class a -> Bool #

(>) :: Class a -> Class a -> Bool #

(>=) :: Class a -> Class a -> Bool #

max :: Class a -> Class a -> Class a #

min :: Class a -> Class a -> Class a #

Show a => Show (Class a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Class a -> ShowS #

show :: Class a -> String #

showList :: [Class a] -> ShowS #

Generic (Class a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Class a) :: Type -> Type #

Methods

from :: Class a -> Rep (Class a) x #

to :: Rep (Class a) x -> Class a #

Generic1 Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Class :: k -> Type #

Methods

from1 :: forall (a :: k). Class a -> Rep1 Class a #

to1 :: forall (a :: k). Rep1 Class a -> Class a #

type Rep (Class a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Class Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data CatchClause a Source #

Instances

Instances details
Functor CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> CatchClause a -> CatchClause b #

(<$) :: a -> CatchClause b -> CatchClause a #

Foldable CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => CatchClause m -> m #

foldMap :: Monoid m => (a -> m) -> CatchClause a -> m #

foldMap' :: Monoid m => (a -> m) -> CatchClause a -> m #

foldr :: (a -> b -> b) -> b -> CatchClause a -> b #

foldr' :: (a -> b -> b) -> b -> CatchClause a -> b #

foldl :: (b -> a -> b) -> b -> CatchClause a -> b #

foldl' :: (b -> a -> b) -> b -> CatchClause a -> b #

foldr1 :: (a -> a -> a) -> CatchClause a -> a #

foldl1 :: (a -> a -> a) -> CatchClause a -> a #

toList :: CatchClause a -> [a] #

null :: CatchClause a -> Bool #

length :: CatchClause a -> Int #

elem :: Eq a => a -> CatchClause a -> Bool #

maximum :: Ord a => CatchClause a -> a #

minimum :: Ord a => CatchClause a -> a #

sum :: Num a => CatchClause a -> a #

product :: Num a => CatchClause a -> a #

Traversable CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> CatchClause a -> f (CatchClause b) #

sequenceA :: Applicative f => CatchClause (f a) -> f (CatchClause a) #

mapM :: Monad m => (a -> m b) -> CatchClause a -> m (CatchClause b) #

sequence :: Monad m => CatchClause (m a) -> m (CatchClause a) #

SymbolMatching CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match CatchClause)

matchers :: B (Int, Match CatchClause)

Eq a => Eq (CatchClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (CatchClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (CatchClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (CatchClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (CatchClause a) :: Type -> Type #

Methods

from :: CatchClause a -> Rep (CatchClause a) x #

to :: Rep (CatchClause a) x -> CatchClause a #

Generic1 CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 CatchClause :: k -> Type #

Methods

from1 :: forall (a :: k). CatchClause a -> Rep1 CatchClause a #

to1 :: forall (a :: k). Rep1 CatchClause a -> CatchClause a #

type Rep (CatchClause a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (CatchClause a) = D1 ('MetaData "CatchClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "CatchClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (StatementBlock a)) :*: S1 ('MetaSel ('Just "parameter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ((DestructuringPattern :+: Identifier) a))))))
type Rep1 CatchClause Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 CatchClause = D1 ('MetaData "CatchClause" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "CatchClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 StatementBlock) :*: S1 ('MetaSel ('Just "parameter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 (DestructuringPattern :+: Identifier)))))

data CallSignature a Source #

Instances

Instances details
Functor CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> CallSignature a -> CallSignature b #

(<$) :: a -> CallSignature b -> CallSignature a #

Foldable CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => CallSignature m -> m #

foldMap :: Monoid m => (a -> m) -> CallSignature a -> m #

foldMap' :: Monoid m => (a -> m) -> CallSignature a -> m #

foldr :: (a -> b -> b) -> b -> CallSignature a -> b #

foldr' :: (a -> b -> b) -> b -> CallSignature a -> b #

foldl :: (b -> a -> b) -> b -> CallSignature a -> b #

foldl' :: (b -> a -> b) -> b -> CallSignature a -> b #

foldr1 :: (a -> a -> a) -> CallSignature a -> a #

foldl1 :: (a -> a -> a) -> CallSignature a -> a #

toList :: CallSignature a -> [a] #

null :: CallSignature a -> Bool #

length :: CallSignature a -> Int #

elem :: Eq a => a -> CallSignature a -> Bool #

maximum :: Ord a => CallSignature a -> a #

minimum :: Ord a => CallSignature a -> a #

sum :: Num a => CallSignature a -> a #

product :: Num a => CallSignature a -> a #

Traversable CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> CallSignature a -> f (CallSignature b) #

sequenceA :: Applicative f => CallSignature (f a) -> f (CallSignature a) #

mapM :: Monad m => (a -> m b) -> CallSignature a -> m (CallSignature b) #

sequence :: Monad m => CallSignature (m a) -> m (CallSignature a) #

SymbolMatching CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match CallSignature)

matchers :: B (Int, Match CallSignature)

Eq a => Eq (CallSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (CallSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (CallSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (CallSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (CallSignature a) :: Type -> Type #

Generic1 CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 CallSignature :: k -> Type #

Methods

from1 :: forall (a :: k). CallSignature a -> Rep1 CallSignature a #

to1 :: forall (a :: k). Rep1 CallSignature a -> CallSignature a #

type Rep (CallSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (CallSignature a) = D1 ('MetaData "CallSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "CallSignature" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "returnType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeAnnotation a)))) :*: (S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FormalParameters a)) :*: S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeParameters a))))))
type Rep1 CallSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 CallSignature = D1 ('MetaData "CallSignature" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "CallSignature" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "returnType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 TypeAnnotation)) :*: (S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 FormalParameters) :*: S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 TypeParameters))))

data CallExpression a Source #

Instances

Instances details
Functor CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> CallExpression a -> CallExpression b #

(<$) :: a -> CallExpression b -> CallExpression a #

Foldable CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => CallExpression m -> m #

foldMap :: Monoid m => (a -> m) -> CallExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> CallExpression a -> m #

foldr :: (a -> b -> b) -> b -> CallExpression a -> b #

foldr' :: (a -> b -> b) -> b -> CallExpression a -> b #

foldl :: (b -> a -> b) -> b -> CallExpression a -> b #

foldl' :: (b -> a -> b) -> b -> CallExpression a -> b #

foldr1 :: (a -> a -> a) -> CallExpression a -> a #

foldl1 :: (a -> a -> a) -> CallExpression a -> a #

toList :: CallExpression a -> [a] #

null :: CallExpression a -> Bool #

length :: CallExpression a -> Int #

elem :: Eq a => a -> CallExpression a -> Bool #

maximum :: Ord a => CallExpression a -> a #

minimum :: Ord a => CallExpression a -> a #

sum :: Num a => CallExpression a -> a #

product :: Num a => CallExpression a -> a #

Traversable CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> CallExpression a -> f (CallExpression b) #

sequenceA :: Applicative f => CallExpression (f a) -> f (CallExpression a) #

mapM :: Monad m => (a -> m b) -> CallExpression a -> m (CallExpression b) #

sequence :: Monad m => CallExpression (m a) -> m (CallExpression a) #

SymbolMatching CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match CallExpression)

matchers :: B (Int, Match CallExpression)

Eq a => Eq (CallExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (CallExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (CallExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (CallExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (CallExpression a) :: Type -> Type #

Generic1 CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 CallExpression :: k -> Type #

Methods

from1 :: forall (a :: k). CallExpression a -> Rep1 CallExpression a #

to1 :: forall (a :: k). Rep1 CallExpression a -> CallExpression a #

type Rep (CallExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (CallExpression a) = D1 ('MetaData "CallExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "CallExpression" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "function") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))) :*: (S1 ('MetaSel ('Just "arguments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Arguments :+: TemplateString) a)) :*: S1 ('MetaSel ('Just "typeArguments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeArguments a))))))
type Rep1 CallExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 CallExpression = D1 ('MetaData "CallExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "CallExpression" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "function") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)) :*: (S1 ('MetaSel ('Just "arguments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Arguments :+: TemplateString)) :*: S1 ('MetaSel ('Just "typeArguments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 TypeArguments))))

data BreakStatement a Source #

Constructors

BreakStatement 

Fields

Instances

Instances details
Functor BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> BreakStatement a -> BreakStatement b #

(<$) :: a -> BreakStatement b -> BreakStatement a #

Foldable BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => BreakStatement m -> m #

foldMap :: Monoid m => (a -> m) -> BreakStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> BreakStatement a -> m #

foldr :: (a -> b -> b) -> b -> BreakStatement a -> b #

foldr' :: (a -> b -> b) -> b -> BreakStatement a -> b #

foldl :: (b -> a -> b) -> b -> BreakStatement a -> b #

foldl' :: (b -> a -> b) -> b -> BreakStatement a -> b #

foldr1 :: (a -> a -> a) -> BreakStatement a -> a #

foldl1 :: (a -> a -> a) -> BreakStatement a -> a #

toList :: BreakStatement a -> [a] #

null :: BreakStatement a -> Bool #

length :: BreakStatement a -> Int #

elem :: Eq a => a -> BreakStatement a -> Bool #

maximum :: Ord a => BreakStatement a -> a #

minimum :: Ord a => BreakStatement a -> a #

sum :: Num a => BreakStatement a -> a #

product :: Num a => BreakStatement a -> a #

Traversable BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> BreakStatement a -> f (BreakStatement b) #

sequenceA :: Applicative f => BreakStatement (f a) -> f (BreakStatement a) #

mapM :: Monad m => (a -> m b) -> BreakStatement a -> m (BreakStatement b) #

sequence :: Monad m => BreakStatement (m a) -> m (BreakStatement a) #

SymbolMatching BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match BreakStatement)

matchers :: B (Int, Match BreakStatement)

Eq a => Eq (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (BreakStatement a) :: Type -> Type #

Generic1 BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 BreakStatement :: k -> Type #

Methods

from1 :: forall (a :: k). BreakStatement a -> Rep1 BreakStatement a #

to1 :: forall (a :: k). Rep1 BreakStatement a -> BreakStatement a #

type Rep (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (BreakStatement a) = D1 ('MetaData "BreakStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "BreakStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (StatementIdentifier a)))))
type Rep1 BreakStatement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 BreakStatement = D1 ('MetaData "BreakStatement" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "BreakStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "label") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 StatementIdentifier)))

data BinaryExpression a Source #

Instances

Instances details
Functor BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> BinaryExpression a -> BinaryExpression b #

(<$) :: a -> BinaryExpression b -> BinaryExpression a #

Foldable BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => BinaryExpression m -> m #

foldMap :: Monoid m => (a -> m) -> BinaryExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> BinaryExpression a -> m #

foldr :: (a -> b -> b) -> b -> BinaryExpression a -> b #

foldr' :: (a -> b -> b) -> b -> BinaryExpression a -> b #

foldl :: (b -> a -> b) -> b -> BinaryExpression a -> b #

foldl' :: (b -> a -> b) -> b -> BinaryExpression a -> b #

foldr1 :: (a -> a -> a) -> BinaryExpression a -> a #

foldl1 :: (a -> a -> a) -> BinaryExpression a -> a #

toList :: BinaryExpression a -> [a] #

null :: BinaryExpression a -> Bool #

length :: BinaryExpression a -> Int #

elem :: Eq a => a -> BinaryExpression a -> Bool #

maximum :: Ord a => BinaryExpression a -> a #

minimum :: Ord a => BinaryExpression a -> a #

sum :: Num a => BinaryExpression a -> a #

product :: Num a => BinaryExpression a -> a #

Traversable BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> BinaryExpression a -> f (BinaryExpression b) #

sequenceA :: Applicative f => BinaryExpression (f a) -> f (BinaryExpression a) #

mapM :: Monad m => (a -> m b) -> BinaryExpression a -> m (BinaryExpression b) #

sequence :: Monad m => BinaryExpression (m a) -> m (BinaryExpression a) #

SymbolMatching BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (BinaryExpression a) :: Type -> Type #

Generic1 BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 BinaryExpression :: k -> Type #

Methods

from1 :: forall (a :: k). BinaryExpression a -> Rep1 BinaryExpression a #

to1 :: forall (a :: k). Rep1 BinaryExpression a -> BinaryExpression a #

type Rep (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 BinaryExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data AwaitExpression a Source #

Constructors

AwaitExpression 

Fields

Instances

Instances details
Functor AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> AwaitExpression a -> AwaitExpression b #

(<$) :: a -> AwaitExpression b -> AwaitExpression a #

Foldable AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AwaitExpression m -> m #

foldMap :: Monoid m => (a -> m) -> AwaitExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> AwaitExpression a -> m #

foldr :: (a -> b -> b) -> b -> AwaitExpression a -> b #

foldr' :: (a -> b -> b) -> b -> AwaitExpression a -> b #

foldl :: (b -> a -> b) -> b -> AwaitExpression a -> b #

foldl' :: (b -> a -> b) -> b -> AwaitExpression a -> b #

foldr1 :: (a -> a -> a) -> AwaitExpression a -> a #

foldl1 :: (a -> a -> a) -> AwaitExpression a -> a #

toList :: AwaitExpression a -> [a] #

null :: AwaitExpression a -> Bool #

length :: AwaitExpression a -> Int #

elem :: Eq a => a -> AwaitExpression a -> Bool #

maximum :: Ord a => AwaitExpression a -> a #

minimum :: Ord a => AwaitExpression a -> a #

sum :: Num a => AwaitExpression a -> a #

product :: Num a => AwaitExpression a -> a #

Traversable AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> AwaitExpression a -> f (AwaitExpression b) #

sequenceA :: Applicative f => AwaitExpression (f a) -> f (AwaitExpression a) #

mapM :: Monad m => (a -> m b) -> AwaitExpression a -> m (AwaitExpression b) #

sequence :: Monad m => AwaitExpression (m a) -> m (AwaitExpression a) #

SymbolMatching AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AwaitExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AwaitExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AwaitExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AwaitExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AwaitExpression a) :: Type -> Type #

Generic1 AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AwaitExpression :: k -> Type #

Methods

from1 :: forall (a :: k). AwaitExpression a -> Rep1 AwaitExpression a #

to1 :: forall (a :: k). Rep1 AwaitExpression a -> AwaitExpression a #

type Rep (AwaitExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (AwaitExpression a) = D1 ('MetaData "AwaitExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AwaitExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 AwaitExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AwaitExpression = D1 ('MetaData "AwaitExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AwaitExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data AugmentedAssignmentExpression a Source #

Instances

Instances details
Functor AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Traversable AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AugmentedAssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AugmentedAssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AugmentedAssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AugmentedAssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AugmentedAssignmentExpression a) :: Type -> Type #

Generic1 AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AugmentedAssignmentExpression :: k -> Type #

type Rep (AugmentedAssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (AugmentedAssignmentExpression a) = D1 ('MetaData "AugmentedAssignmentExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AugmentedAssignmentExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((Identifier :+: MemberExpression) :+: (ParenthesizedExpression :+: SubscriptExpression)) a)) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 AugmentedAssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AugmentedAssignmentExpression = D1 ('MetaData "AugmentedAssignmentExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AugmentedAssignmentExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ((Identifier :+: MemberExpression) :+: (ParenthesizedExpression :+: SubscriptExpression))) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data AssignmentPattern a Source #

Instances

Instances details
Functor AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AssignmentPattern m -> m #

foldMap :: Monoid m => (a -> m) -> AssignmentPattern a -> m #

foldMap' :: Monoid m => (a -> m) -> AssignmentPattern a -> m #

foldr :: (a -> b -> b) -> b -> AssignmentPattern a -> b #

foldr' :: (a -> b -> b) -> b -> AssignmentPattern a -> b #

foldl :: (b -> a -> b) -> b -> AssignmentPattern a -> b #

foldl' :: (b -> a -> b) -> b -> AssignmentPattern a -> b #

foldr1 :: (a -> a -> a) -> AssignmentPattern a -> a #

foldl1 :: (a -> a -> a) -> AssignmentPattern a -> a #

toList :: AssignmentPattern a -> [a] #

null :: AssignmentPattern a -> Bool #

length :: AssignmentPattern a -> Int #

elem :: Eq a => a -> AssignmentPattern a -> Bool #

maximum :: Ord a => AssignmentPattern a -> a #

minimum :: Ord a => AssignmentPattern a -> a #

sum :: Num a => AssignmentPattern a -> a #

product :: Num a => AssignmentPattern a -> a #

Traversable AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> AssignmentPattern a -> f (AssignmentPattern b) #

sequenceA :: Applicative f => AssignmentPattern (f a) -> f (AssignmentPattern a) #

mapM :: Monad m => (a -> m b) -> AssignmentPattern a -> m (AssignmentPattern b) #

sequence :: Monad m => AssignmentPattern (m a) -> m (AssignmentPattern a) #

SymbolMatching AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AssignmentPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AssignmentPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AssignmentPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AssignmentPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AssignmentPattern a) :: Type -> Type #

Generic1 AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AssignmentPattern :: k -> Type #

Methods

from1 :: forall (a :: k). AssignmentPattern a -> Rep1 AssignmentPattern a #

to1 :: forall (a :: k). Rep1 AssignmentPattern a -> AssignmentPattern a #

type Rep (AssignmentPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (AssignmentPattern a) = D1 ('MetaData "AssignmentPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AssignmentPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((DestructuringPattern :+: ShorthandPropertyIdentifier) a)) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 AssignmentPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AssignmentPattern = D1 ('MetaData "AssignmentPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AssignmentPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (DestructuringPattern :+: ShorthandPropertyIdentifier)) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data AssignmentExpression a Source #

Instances

Instances details
Functor AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AssignmentExpression m -> m #

foldMap :: Monoid m => (a -> m) -> AssignmentExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> AssignmentExpression a -> m #

foldr :: (a -> b -> b) -> b -> AssignmentExpression a -> b #

foldr' :: (a -> b -> b) -> b -> AssignmentExpression a -> b #

foldl :: (b -> a -> b) -> b -> AssignmentExpression a -> b #

foldl' :: (b -> a -> b) -> b -> AssignmentExpression a -> b #

foldr1 :: (a -> a -> a) -> AssignmentExpression a -> a #

foldl1 :: (a -> a -> a) -> AssignmentExpression a -> a #

toList :: AssignmentExpression a -> [a] #

null :: AssignmentExpression a -> Bool #

length :: AssignmentExpression a -> Int #

elem :: Eq a => a -> AssignmentExpression a -> Bool #

maximum :: Ord a => AssignmentExpression a -> a #

minimum :: Ord a => AssignmentExpression a -> a #

sum :: Num a => AssignmentExpression a -> a #

product :: Num a => AssignmentExpression a -> a #

Traversable AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AssignmentExpression a) :: Type -> Type #

Generic1 AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AssignmentExpression :: k -> Type #

Methods

from1 :: forall (a :: k). AssignmentExpression a -> Rep1 AssignmentExpression a #

to1 :: forall (a :: k). Rep1 AssignmentExpression a -> AssignmentExpression a #

type Rep (AssignmentExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (AssignmentExpression a) = D1 ('MetaData "AssignmentExpression" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AssignmentExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((DestructuringPattern :+: Identifier) :+: (MemberExpression :+: (ParenthesizedExpression :+: SubscriptExpression))) a)) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 AssignmentExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data AsExpression a Source #

Instances

Instances details
Functor AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> AsExpression a -> AsExpression b #

(<$) :: a -> AsExpression b -> AsExpression a #

Foldable AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AsExpression m -> m #

foldMap :: Monoid m => (a -> m) -> AsExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> AsExpression a -> m #

foldr :: (a -> b -> b) -> b -> AsExpression a -> b #

foldr' :: (a -> b -> b) -> b -> AsExpression a -> b #

foldl :: (b -> a -> b) -> b -> AsExpression a -> b #

foldl' :: (b -> a -> b) -> b -> AsExpression a -> b #

foldr1 :: (a -> a -> a) -> AsExpression a -> a #

foldl1 :: (a -> a -> a) -> AsExpression a -> a #

toList :: AsExpression a -> [a] #

null :: AsExpression a -> Bool #

length :: AsExpression a -> Int #

elem :: Eq a => a -> AsExpression a -> Bool #

maximum :: Ord a => AsExpression a -> a #

minimum :: Ord a => AsExpression a -> a #

sum :: Num a => AsExpression a -> a #

product :: Num a => AsExpression a -> a #

Traversable AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> AsExpression a -> f (AsExpression b) #

sequenceA :: Applicative f => AsExpression (f a) -> f (AsExpression a) #

mapM :: Monad m => (a -> m b) -> AsExpression a -> m (AsExpression b) #

sequence :: Monad m => AsExpression (m a) -> m (AsExpression a) #

SymbolMatching AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match AsExpression)

matchers :: B (Int, Match AsExpression)

Eq a => Eq (AsExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AsExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AsExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AsExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AsExpression a) :: Type -> Type #

Methods

from :: AsExpression a -> Rep (AsExpression a) x #

to :: Rep (AsExpression a) x -> AsExpression a #

Generic1 AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AsExpression :: k -> Type #

Methods

from1 :: forall (a :: k). AsExpression a -> Rep1 AsExpression a #

to1 :: forall (a :: k). Rep1 AsExpression a -> AsExpression a #

type Rep (AsExpression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AsExpression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ArrowFunction a Source #

Instances

Instances details
Functor ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ArrowFunction a -> ArrowFunction b #

(<$) :: a -> ArrowFunction b -> ArrowFunction a #

Foldable ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ArrowFunction m -> m #

foldMap :: Monoid m => (a -> m) -> ArrowFunction a -> m #

foldMap' :: Monoid m => (a -> m) -> ArrowFunction a -> m #

foldr :: (a -> b -> b) -> b -> ArrowFunction a -> b #

foldr' :: (a -> b -> b) -> b -> ArrowFunction a -> b #

foldl :: (b -> a -> b) -> b -> ArrowFunction a -> b #

foldl' :: (b -> a -> b) -> b -> ArrowFunction a -> b #

foldr1 :: (a -> a -> a) -> ArrowFunction a -> a #

foldl1 :: (a -> a -> a) -> ArrowFunction a -> a #

toList :: ArrowFunction a -> [a] #

null :: ArrowFunction a -> Bool #

length :: ArrowFunction a -> Int #

elem :: Eq a => a -> ArrowFunction a -> Bool #

maximum :: Ord a => ArrowFunction a -> a #

minimum :: Ord a => ArrowFunction a -> a #

sum :: Num a => ArrowFunction a -> a #

product :: Num a => ArrowFunction a -> a #

Traversable ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArrowFunction a -> f (ArrowFunction b) #

sequenceA :: Applicative f => ArrowFunction (f a) -> f (ArrowFunction a) #

mapM :: Monad m => (a -> m b) -> ArrowFunction a -> m (ArrowFunction b) #

sequence :: Monad m => ArrowFunction (m a) -> m (ArrowFunction a) #

SymbolMatching ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ArrowFunction)

matchers :: B (Int, Match ArrowFunction)

Eq a => Eq (ArrowFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ArrowFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ArrowFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ArrowFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ArrowFunction a) :: Type -> Type #

Generic1 ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ArrowFunction :: k -> Type #

Methods

from1 :: forall (a :: k). ArrowFunction a -> Rep1 ArrowFunction a #

to1 :: forall (a :: k). Rep1 ArrowFunction a -> ArrowFunction a #

type Rep (ArrowFunction a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ArrowFunction Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ArrayType a Source #

Instances

Instances details
Functor ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ArrayType a -> ArrayType b #

(<$) :: a -> ArrayType b -> ArrayType a #

Foldable ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ArrayType m -> m #

foldMap :: Monoid m => (a -> m) -> ArrayType a -> m #

foldMap' :: Monoid m => (a -> m) -> ArrayType a -> m #

foldr :: (a -> b -> b) -> b -> ArrayType a -> b #

foldr' :: (a -> b -> b) -> b -> ArrayType a -> b #

foldl :: (b -> a -> b) -> b -> ArrayType a -> b #

foldl' :: (b -> a -> b) -> b -> ArrayType a -> b #

foldr1 :: (a -> a -> a) -> ArrayType a -> a #

foldl1 :: (a -> a -> a) -> ArrayType a -> a #

toList :: ArrayType a -> [a] #

null :: ArrayType a -> Bool #

length :: ArrayType a -> Int #

elem :: Eq a => a -> ArrayType a -> Bool #

maximum :: Ord a => ArrayType a -> a #

minimum :: Ord a => ArrayType a -> a #

sum :: Num a => ArrayType a -> a #

product :: Num a => ArrayType a -> a #

Traversable ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArrayType a -> f (ArrayType b) #

sequenceA :: Applicative f => ArrayType (f a) -> f (ArrayType a) #

mapM :: Monad m => (a -> m b) -> ArrayType a -> m (ArrayType b) #

sequence :: Monad m => ArrayType (m a) -> m (ArrayType a) #

SymbolMatching ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ArrayType)

matchers :: B (Int, Match ArrayType)

Eq a => Eq (ArrayType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: ArrayType a -> ArrayType a -> Bool #

(/=) :: ArrayType a -> ArrayType a -> Bool #

Ord a => Ord (ArrayType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ArrayType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ArrayType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ArrayType a) :: Type -> Type #

Methods

from :: ArrayType a -> Rep (ArrayType a) x #

to :: Rep (ArrayType a) x -> ArrayType a #

Generic1 ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ArrayType :: k -> Type #

Methods

from1 :: forall (a :: k). ArrayType a -> Rep1 ArrayType a #

to1 :: forall (a :: k). Rep1 ArrayType a -> ArrayType a #

type Rep (ArrayType a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ArrayType Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data ArrayPattern a Source #

Constructors

ArrayPattern 

Fields

Instances

Instances details
Functor ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> ArrayPattern a -> ArrayPattern b #

(<$) :: a -> ArrayPattern b -> ArrayPattern a #

Foldable ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => ArrayPattern m -> m #

foldMap :: Monoid m => (a -> m) -> ArrayPattern a -> m #

foldMap' :: Monoid m => (a -> m) -> ArrayPattern a -> m #

foldr :: (a -> b -> b) -> b -> ArrayPattern a -> b #

foldr' :: (a -> b -> b) -> b -> ArrayPattern a -> b #

foldl :: (b -> a -> b) -> b -> ArrayPattern a -> b #

foldl' :: (b -> a -> b) -> b -> ArrayPattern a -> b #

foldr1 :: (a -> a -> a) -> ArrayPattern a -> a #

foldl1 :: (a -> a -> a) -> ArrayPattern a -> a #

toList :: ArrayPattern a -> [a] #

null :: ArrayPattern a -> Bool #

length :: ArrayPattern a -> Int #

elem :: Eq a => a -> ArrayPattern a -> Bool #

maximum :: Ord a => ArrayPattern a -> a #

minimum :: Ord a => ArrayPattern a -> a #

sum :: Num a => ArrayPattern a -> a #

product :: Num a => ArrayPattern a -> a #

Traversable ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArrayPattern a -> f (ArrayPattern b) #

sequenceA :: Applicative f => ArrayPattern (f a) -> f (ArrayPattern a) #

mapM :: Monad m => (a -> m b) -> ArrayPattern a -> m (ArrayPattern b) #

sequence :: Monad m => ArrayPattern (m a) -> m (ArrayPattern a) #

SymbolMatching ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match ArrayPattern)

matchers :: B (Int, Match ArrayPattern)

Eq a => Eq (ArrayPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (ArrayPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (ArrayPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (ArrayPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (ArrayPattern a) :: Type -> Type #

Methods

from :: ArrayPattern a -> Rep (ArrayPattern a) x #

to :: Rep (ArrayPattern a) x -> ArrayPattern a #

Generic1 ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 ArrayPattern :: k -> Type #

Methods

from1 :: forall (a :: k). ArrayPattern a -> Rep1 ArrayPattern a #

to1 :: forall (a :: k). Rep1 ArrayPattern a -> ArrayPattern a #

type Rep (ArrayPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (ArrayPattern a) = D1 ('MetaData "ArrayPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ArrayPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Expression :+: SpreadElement) a])))
type Rep1 ArrayPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 ArrayPattern = D1 ('MetaData "ArrayPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "ArrayPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (Expression :+: SpreadElement))))

data Array a Source #

Constructors

Array 

Fields

Instances

Instances details
Functor Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Array a -> Array b #

(<$) :: a -> Array b -> Array a #

Foldable Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Array m -> m #

foldMap :: Monoid m => (a -> m) -> Array a -> m #

foldMap' :: Monoid m => (a -> m) -> Array a -> m #

foldr :: (a -> b -> b) -> b -> Array a -> b #

foldr' :: (a -> b -> b) -> b -> Array a -> b #

foldl :: (b -> a -> b) -> b -> Array a -> b #

foldl' :: (b -> a -> b) -> b -> Array a -> b #

foldr1 :: (a -> a -> a) -> Array a -> a #

foldl1 :: (a -> a -> a) -> Array a -> a #

toList :: Array a -> [a] #

null :: Array a -> Bool #

length :: Array a -> Int #

elem :: Eq a => a -> Array a -> Bool #

maximum :: Ord a => Array a -> a #

minimum :: Ord a => Array a -> a #

sum :: Num a => Array a -> a #

product :: Num a => Array a -> a #

Traversable Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Array a -> f (Array b) #

sequenceA :: Applicative f => Array (f a) -> f (Array a) #

mapM :: Monad m => (a -> m b) -> Array a -> m (Array b) #

sequence :: Monad m => Array (m a) -> m (Array a) #

SymbolMatching Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Array)

matchers :: B (Int, Match Array)

Eq a => Eq (Array a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Array a -> Array a -> Bool #

(/=) :: Array a -> Array a -> Bool #

Ord a => Ord (Array a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

Show a => Show (Array a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String #

showList :: [Array a] -> ShowS #

Generic (Array a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Array a) :: Type -> Type #

Methods

from :: Array a -> Rep (Array a) x #

to :: Rep (Array a) x -> Array a #

Generic1 Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Array :: k -> Type #

Methods

from1 :: forall (a :: k). Array a -> Rep1 Array a #

to1 :: forall (a :: k). Rep1 Array a -> Array a #

type Rep (Array a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Array a) = D1 ('MetaData "Array" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Array" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Expression :+: SpreadElement) a])))
type Rep1 Array Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Array = D1 ('MetaData "Array" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Array" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (Expression :+: SpreadElement))))

data Arguments a Source #

Constructors

Arguments 

Fields

Instances

Instances details
Functor Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Arguments a -> Arguments b #

(<$) :: a -> Arguments b -> Arguments a #

Foldable Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Arguments m -> m #

foldMap :: Monoid m => (a -> m) -> Arguments a -> m #

foldMap' :: Monoid m => (a -> m) -> Arguments a -> m #

foldr :: (a -> b -> b) -> b -> Arguments a -> b #

foldr' :: (a -> b -> b) -> b -> Arguments a -> b #

foldl :: (b -> a -> b) -> b -> Arguments a -> b #

foldl' :: (b -> a -> b) -> b -> Arguments a -> b #

foldr1 :: (a -> a -> a) -> Arguments a -> a #

foldl1 :: (a -> a -> a) -> Arguments a -> a #

toList :: Arguments a -> [a] #

null :: Arguments a -> Bool #

length :: Arguments a -> Int #

elem :: Eq a => a -> Arguments a -> Bool #

maximum :: Ord a => Arguments a -> a #

minimum :: Ord a => Arguments a -> a #

sum :: Num a => Arguments a -> a #

product :: Num a => Arguments a -> a #

Traversable Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Arguments a -> f (Arguments b) #

sequenceA :: Applicative f => Arguments (f a) -> f (Arguments a) #

mapM :: Monad m => (a -> m b) -> Arguments a -> m (Arguments b) #

sequence :: Monad m => Arguments (m a) -> m (Arguments a) #

SymbolMatching Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Arguments)

matchers :: B (Int, Match Arguments)

Eq a => Eq (Arguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Arguments a -> Arguments a -> Bool #

(/=) :: Arguments a -> Arguments a -> Bool #

Ord a => Ord (Arguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (Arguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (Arguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Arguments a) :: Type -> Type #

Methods

from :: Arguments a -> Rep (Arguments a) x #

to :: Rep (Arguments a) x -> Arguments a #

Generic1 Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Arguments :: k -> Type #

Methods

from1 :: forall (a :: k). Arguments a -> Rep1 Arguments a #

to1 :: forall (a :: k). Rep1 Arguments a -> Arguments a #

type Rep (Arguments a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (Arguments a) = D1 ('MetaData "Arguments" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Arguments" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Expression :+: SpreadElement) a])))
type Rep1 Arguments Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Arguments = D1 ('MetaData "Arguments" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "Arguments" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (Expression :+: SpreadElement))))

data AmbientDeclaration a Source #

Instances

Instances details
Functor AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AmbientDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> AmbientDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> AmbientDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> AmbientDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> AmbientDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> AmbientDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> AmbientDeclaration a -> b #

foldr1 :: (a -> a -> a) -> AmbientDeclaration a -> a #

foldl1 :: (a -> a -> a) -> AmbientDeclaration a -> a #

toList :: AmbientDeclaration a -> [a] #

null :: AmbientDeclaration a -> Bool #

length :: AmbientDeclaration a -> Int #

elem :: Eq a => a -> AmbientDeclaration a -> Bool #

maximum :: Ord a => AmbientDeclaration a -> a #

minimum :: Ord a => AmbientDeclaration a -> a #

sum :: Num a => AmbientDeclaration a -> a #

product :: Num a => AmbientDeclaration a -> a #

Traversable AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AmbientDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AmbientDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AmbientDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AmbientDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AmbientDeclaration a) :: Type -> Type #

Generic1 AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AmbientDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). AmbientDeclaration a -> Rep1 AmbientDeclaration a #

to1 :: forall (a :: k). Rep1 AmbientDeclaration a -> AmbientDeclaration a #

type Rep (AmbientDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AmbientDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data AccessibilityModifier a Source #

Constructors

AccessibilityModifier 

Fields

Instances

Instances details
Functor AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AccessibilityModifier m -> m #

foldMap :: Monoid m => (a -> m) -> AccessibilityModifier a -> m #

foldMap' :: Monoid m => (a -> m) -> AccessibilityModifier a -> m #

foldr :: (a -> b -> b) -> b -> AccessibilityModifier a -> b #

foldr' :: (a -> b -> b) -> b -> AccessibilityModifier a -> b #

foldl :: (b -> a -> b) -> b -> AccessibilityModifier a -> b #

foldl' :: (b -> a -> b) -> b -> AccessibilityModifier a -> b #

foldr1 :: (a -> a -> a) -> AccessibilityModifier a -> a #

foldl1 :: (a -> a -> a) -> AccessibilityModifier a -> a #

toList :: AccessibilityModifier a -> [a] #

null :: AccessibilityModifier a -> Bool #

length :: AccessibilityModifier a -> Int #

elem :: Eq a => a -> AccessibilityModifier a -> Bool #

maximum :: Ord a => AccessibilityModifier a -> a #

minimum :: Ord a => AccessibilityModifier a -> a #

sum :: Num a => AccessibilityModifier a -> a #

product :: Num a => AccessibilityModifier a -> a #

Traversable AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AccessibilityModifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AccessibilityModifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AccessibilityModifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AccessibilityModifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AccessibilityModifier a) :: Type -> Type #

Generic1 AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AccessibilityModifier :: k -> Type #

Methods

from1 :: forall (a :: k). AccessibilityModifier a -> Rep1 AccessibilityModifier a #

to1 :: forall (a :: k). Rep1 AccessibilityModifier a -> AccessibilityModifier a #

type Rep (AccessibilityModifier a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (AccessibilityModifier a) = D1 ('MetaData "AccessibilityModifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AccessibilityModifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 AccessibilityModifier Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AccessibilityModifier = D1 ('MetaData "AccessibilityModifier" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AccessibilityModifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data AbstractMethodSignature a Source #

Instances

Instances details
Functor AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AbstractMethodSignature m -> m #

foldMap :: Monoid m => (a -> m) -> AbstractMethodSignature a -> m #

foldMap' :: Monoid m => (a -> m) -> AbstractMethodSignature a -> m #

foldr :: (a -> b -> b) -> b -> AbstractMethodSignature a -> b #

foldr' :: (a -> b -> b) -> b -> AbstractMethodSignature a -> b #

foldl :: (b -> a -> b) -> b -> AbstractMethodSignature a -> b #

foldl' :: (b -> a -> b) -> b -> AbstractMethodSignature a -> b #

foldr1 :: (a -> a -> a) -> AbstractMethodSignature a -> a #

foldl1 :: (a -> a -> a) -> AbstractMethodSignature a -> a #

toList :: AbstractMethodSignature a -> [a] #

null :: AbstractMethodSignature a -> Bool #

length :: AbstractMethodSignature a -> Int #

elem :: Eq a => a -> AbstractMethodSignature a -> Bool #

maximum :: Ord a => AbstractMethodSignature a -> a #

minimum :: Ord a => AbstractMethodSignature a -> a #

sum :: Num a => AbstractMethodSignature a -> a #

product :: Num a => AbstractMethodSignature a -> a #

Traversable AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AbstractMethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AbstractMethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AbstractMethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AbstractMethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AbstractMethodSignature a) :: Type -> Type #

Generic1 AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AbstractMethodSignature :: k -> Type #

type Rep (AbstractMethodSignature a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 AbstractMethodSignature Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

data AbstractClassDeclaration a Source #

Instances

Instances details
Functor AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => AbstractClassDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> AbstractClassDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> AbstractClassDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> AbstractClassDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> AbstractClassDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> AbstractClassDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> AbstractClassDeclaration a -> b #

foldr1 :: (a -> a -> a) -> AbstractClassDeclaration a -> a #

foldl1 :: (a -> a -> a) -> AbstractClassDeclaration a -> a #

toList :: AbstractClassDeclaration a -> [a] #

null :: AbstractClassDeclaration a -> Bool #

length :: AbstractClassDeclaration a -> Int #

elem :: Eq a => a -> AbstractClassDeclaration a -> Bool #

maximum :: Ord a => AbstractClassDeclaration a -> a #

minimum :: Ord a => AbstractClassDeclaration a -> a #

sum :: Num a => AbstractClassDeclaration a -> a #

product :: Num a => AbstractClassDeclaration a -> a #

Traversable AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (AbstractClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (AbstractClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (AbstractClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (AbstractClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (AbstractClassDeclaration a) :: Type -> Type #

Generic1 AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 AbstractClassDeclaration :: k -> Type #

type Rep (AbstractClassDeclaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (AbstractClassDeclaration a) = D1 ('MetaData "AbstractClassDeclaration" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'False) (C1 ('MetaCons "AbstractClassDeclaration" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ClassBody a))) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: (S1 ('MetaSel ('Just "typeParameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (TypeParameters a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (ClassHeritage a)))))))
type Rep1 AbstractClassDeclaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

newtype Statement a Source #

Instances

Instances details
Functor Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Statement a -> Statement b #

(<$) :: a -> Statement b -> Statement a #

Foldable Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Statement m -> m #

foldMap :: Monoid m => (a -> m) -> Statement a -> m #

foldMap' :: Monoid m => (a -> m) -> Statement a -> m #

foldr :: (a -> b -> b) -> b -> Statement a -> b #

foldr' :: (a -> b -> b) -> b -> Statement a -> b #

foldl :: (b -> a -> b) -> b -> Statement a -> b #

foldl' :: (b -> a -> b) -> b -> Statement a -> b #

foldr1 :: (a -> a -> a) -> Statement a -> a #

foldl1 :: (a -> a -> a) -> Statement a -> a #

toList :: Statement a -> [a] #

null :: Statement a -> Bool #

length :: Statement a -> Int #

elem :: Eq a => a -> Statement a -> Bool #

maximum :: Ord a => Statement a -> a #

minimum :: Ord a => Statement a -> a #

sum :: Num a => Statement a -> a #

product :: Num a => Statement a -> a #

Traversable Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Statement a -> f (Statement b) #

sequenceA :: Applicative f => Statement (f a) -> f (Statement a) #

mapM :: Monad m => (a -> m b) -> Statement a -> m (Statement b) #

sequence :: Monad m => Statement (m a) -> m (Statement a) #

SymbolMatching Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Statement)

matchers :: B (Int, Match Statement)

HasField "ann" (Statement a) a Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

getField :: Statement a -> a #

Eq a => Eq (Statement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Statement a -> Statement a -> Bool #

(/=) :: Statement a -> Statement a -> Bool #

Ord a => Ord (Statement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (Statement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (Statement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Statement a) :: Type -> Type #

Methods

from :: Statement a -> Rep (Statement a) x #

to :: Rep (Statement a) x -> Statement a #

Generic1 Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Statement :: k -> Type #

Methods

from1 :: forall (a :: k). Statement a -> Rep1 Statement a #

to1 :: forall (a :: k). Rep1 Statement a -> Statement a #

type Rep (Statement a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Statement Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

newtype Expression a Source #

Instances

Instances details
Functor Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Expression a -> Expression b #

(<$) :: a -> Expression b -> Expression a #

Foldable Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Expression m -> m #

foldMap :: Monoid m => (a -> m) -> Expression a -> m #

foldMap' :: Monoid m => (a -> m) -> Expression a -> m #

foldr :: (a -> b -> b) -> b -> Expression a -> b #

foldr' :: (a -> b -> b) -> b -> Expression a -> b #

foldl :: (b -> a -> b) -> b -> Expression a -> b #

foldl' :: (b -> a -> b) -> b -> Expression a -> b #

foldr1 :: (a -> a -> a) -> Expression a -> a #

foldl1 :: (a -> a -> a) -> Expression a -> a #

toList :: Expression a -> [a] #

null :: Expression a -> Bool #

length :: Expression a -> Int #

elem :: Eq a => a -> Expression a -> Bool #

maximum :: Ord a => Expression a -> a #

minimum :: Ord a => Expression a -> a #

sum :: Num a => Expression a -> a #

product :: Num a => Expression a -> a #

Traversable Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Expression a -> f (Expression b) #

sequenceA :: Applicative f => Expression (f a) -> f (Expression a) #

mapM :: Monad m => (a -> m b) -> Expression a -> m (Expression b) #

sequence :: Monad m => Expression (m a) -> m (Expression a) #

SymbolMatching Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Expression)

matchers :: B (Int, Match Expression)

HasField "ann" (Expression a) a Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

getField :: Expression a -> a #

Eq a => Eq (Expression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

(==) :: Expression a -> Expression a -> Bool #

(/=) :: Expression a -> Expression a -> Bool #

Ord a => Ord (Expression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (Expression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (Expression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Expression a) :: Type -> Type #

Methods

from :: Expression a -> Rep (Expression a) x #

to :: Rep (Expression a) x -> Expression a #

Generic1 Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Expression :: k -> Type #

Methods

from1 :: forall (a :: k). Expression a -> Rep1 Expression a #

to1 :: forall (a :: k). Rep1 Expression a -> Expression a #

type Rep (Expression a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Expression Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

newtype DestructuringPattern a Source #

Instances

Instances details
Functor DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Foldable DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => DestructuringPattern m -> m #

foldMap :: Monoid m => (a -> m) -> DestructuringPattern a -> m #

foldMap' :: Monoid m => (a -> m) -> DestructuringPattern a -> m #

foldr :: (a -> b -> b) -> b -> DestructuringPattern a -> b #

foldr' :: (a -> b -> b) -> b -> DestructuringPattern a -> b #

foldl :: (b -> a -> b) -> b -> DestructuringPattern a -> b #

foldl' :: (b -> a -> b) -> b -> DestructuringPattern a -> b #

foldr1 :: (a -> a -> a) -> DestructuringPattern a -> a #

foldl1 :: (a -> a -> a) -> DestructuringPattern a -> a #

toList :: DestructuringPattern a -> [a] #

null :: DestructuringPattern a -> Bool #

length :: DestructuringPattern a -> Int #

elem :: Eq a => a -> DestructuringPattern a -> Bool #

maximum :: Ord a => DestructuringPattern a -> a #

minimum :: Ord a => DestructuringPattern a -> a #

sum :: Num a => DestructuringPattern a -> a #

product :: Num a => DestructuringPattern a -> a #

Traversable DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

SymbolMatching DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

HasField "ann" (DestructuringPattern a) a Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Eq a => Eq (DestructuringPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (DestructuringPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (DestructuringPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (DestructuringPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (DestructuringPattern a) :: Type -> Type #

Generic1 DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 DestructuringPattern :: k -> Type #

Methods

from1 :: forall (a :: k). DestructuringPattern a -> Rep1 DestructuringPattern a #

to1 :: forall (a :: k). Rep1 DestructuringPattern a -> DestructuringPattern a #

type Rep (DestructuringPattern a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep (DestructuringPattern a) = D1 ('MetaData "DestructuringPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'True) (C1 ('MetaCons "DestructuringPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDestructuringPattern") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((ArrayPattern :+: ObjectPattern) a))))
type Rep1 DestructuringPattern Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 DestructuringPattern = D1 ('MetaData "DestructuringPattern" "TreeSitter.TypeScript.AST" "tree-sitter-typescript-0.4.1.0-inplace" 'True) (C1 ('MetaCons "DestructuringPattern" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDestructuringPattern") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (ArrayPattern :+: ObjectPattern))))

newtype Declaration a Source #

Instances

Instances details
Functor Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fmap :: (a -> b) -> Declaration a -> Declaration b #

(<$) :: a -> Declaration b -> Declaration a #

Foldable Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

fold :: Monoid m => Declaration m -> m #

foldMap :: Monoid m => (a -> m) -> Declaration a -> m #

foldMap' :: Monoid m => (a -> m) -> Declaration a -> m #

foldr :: (a -> b -> b) -> b -> Declaration a -> b #

foldr' :: (a -> b -> b) -> b -> Declaration a -> b #

foldl :: (b -> a -> b) -> b -> Declaration a -> b #

foldl' :: (b -> a -> b) -> b -> Declaration a -> b #

foldr1 :: (a -> a -> a) -> Declaration a -> a #

foldl1 :: (a -> a -> a) -> Declaration a -> a #

toList :: Declaration a -> [a] #

null :: Declaration a -> Bool #

length :: Declaration a -> Int #

elem :: Eq a => a -> Declaration a -> Bool #

maximum :: Ord a => Declaration a -> a #

minimum :: Ord a => Declaration a -> a #

sum :: Num a => Declaration a -> a #

product :: Num a => Declaration a -> a #

Traversable Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

traverse :: Applicative f => (a -> f b) -> Declaration a -> f (Declaration b) #

sequenceA :: Applicative f => Declaration (f a) -> f (Declaration a) #

mapM :: Monad m => (a -> m b) -> Declaration a -> m (Declaration b) #

sequence :: Monad m => Declaration (m a) -> m (Declaration a) #

SymbolMatching Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Unmarshal Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

matchers' :: IntMap (Match Declaration)

matchers :: B (Int, Match Declaration)

HasField "ann" (Declaration a) a Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Methods

getField :: Declaration a -> a #

Eq a => Eq (Declaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Ord a => Ord (Declaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Show a => Show (Declaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Generic (Declaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep (Declaration a) :: Type -> Type #

Methods

from :: Declaration a -> Rep (Declaration a) x #

to :: Rep (Declaration a) x -> Declaration a #

Generic1 Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

Associated Types

type Rep1 Declaration :: k -> Type #

Methods

from1 :: forall (a :: k). Declaration a -> Rep1 Declaration a #

to1 :: forall (a :: k). Rep1 Declaration a -> Declaration a #

type Rep (Declaration a) Source # 
Instance details

Defined in TreeSitter.TypeScript.AST

type Rep1 Declaration Source # 
Instance details

Defined in TreeSitter.TypeScript.AST