tree-sitter-go-0.3.1.0: Tree-sitter grammar/parser for Go
Safe HaskellNone
LanguageHaskell2010

TreeSitter.Go.AST

Documentation

type AnonymousRBrace = Token "}" 22 Source #

type AnonymousPipePipe = Token "||" 77 Source #

type AnonymousPipeEqual = Token "|=" 39 Source #

type AnonymousPipe = Token "|" 69 Source #

type AnonymousLBrace = Token "{" 21 Source #

type AnonymousVar = Token "var" 13 Source #

data TypeIdentifier a Source #

Constructors

TypeIdentifier 

Fields

Instances

Instances details
Functor TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable TypeIdentifier Source # 
Instance details

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

Unmarshal TypeIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (TypeIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 TypeIdentifier Source # 
Instance details

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

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

type Rep1 TypeIdentifier = D1 ('MetaData "TypeIdentifier" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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" 16 Source #

data True a Source #

Constructors

True 

Fields

Instances

Instances details
Functor True Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable True Source # 
Instance details

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

Methods

symbolMatch :: Proxy True -> Node -> Bool

showFailure :: Proxy True -> Node -> String

Unmarshal True Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

Methods

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

show :: True a -> String #

showList :: [True a] -> ShowS #

Generic (True a) Source # 
Instance details

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

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

type Rep1 True = D1 ('MetaData "True" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 AnonymousSwitch = Token "switch" 53 Source #

type AnonymousStruct = Token "struct" 20 Source #

type AnonymousSelect = Token "select" 56 Source #

data RuneLiteral a Source #

Constructors

RuneLiteral 

Fields

Instances

Instances details
Functor RuneLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable RuneLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: RuneLiteral a -> [a] #

null :: RuneLiteral a -> Bool #

length :: RuneLiteral a -> Int #

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

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

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

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

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

Traversable RuneLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching RuneLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal RuneLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (RuneLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 RuneLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 RuneLiteral :: k -> Type #

Methods

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

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

type Rep (RuneLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousReturn = Token "return" 46 Source #

data RawStringLiteral a Source #

Constructors

RawStringLiteral 

Fields

Instances

Instances details
Functor RawStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable RawStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: RawStringLiteral a -> [a] #

null :: RawStringLiteral a -> Bool #

length :: RawStringLiteral a -> Int #

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

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

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

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

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

Traversable RawStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching RawStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal RawStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (RawStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 RawStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 RawStringLiteral :: k -> Type #

Methods

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

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

type Rep (RawStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousRange = Token "range" 52 Source #

data PackageIdentifier a Source #

Constructors

PackageIdentifier 

Fields

Instances

Instances details
Functor PackageIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable PackageIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: PackageIdentifier a -> [a] #

null :: PackageIdentifier a -> Bool #

length :: PackageIdentifier a -> Int #

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

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

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

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

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

Traversable PackageIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching PackageIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal PackageIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (PackageIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 PackageIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 PackageIdentifier :: k -> Type #

Methods

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

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

type Rep (PackageIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousPackage = Token "package" 4 Source #

data Nil a Source #

Constructors

Nil 

Fields

Instances

Instances details
Functor Nil Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable Nil Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: Nil a -> [a] #

null :: Nil a -> Bool #

length :: Nil a -> Int #

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

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

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

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

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

Traversable Nil Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching Nil Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy Nil -> Node -> Bool

showFailure :: Proxy Nil -> Node -> String

Unmarshal Nil Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

Methods

compare :: Nil a -> Nil a -> Ordering #

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

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

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

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

max :: Nil a -> Nil a -> Nil a #

min :: Nil a -> Nil a -> Nil a #

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

Defined in TreeSitter.Go.AST

Methods

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

show :: Nil a -> String #

showList :: [Nil a] -> ShowS #

Generic (Nil a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 Nil Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 Nil :: k -> Type #

Methods

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

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

type Rep (Nil a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousMap = Token "map" 24 Source #

data LabelName a Source #

Constructors

LabelName 

Fields

Instances

Instances details
Functor LabelName Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable LabelName Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: LabelName a -> [a] #

null :: LabelName a -> Bool #

length :: LabelName a -> Int #

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

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

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

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

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

Traversable LabelName Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching LabelName Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy LabelName -> Node -> Bool

showFailure :: Proxy LabelName -> Node -> String

Unmarshal LabelName Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (LabelName a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 LabelName Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 LabelName :: k -> Type #

Methods

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

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

type Rep (LabelName a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousInterface = Token "interface" 23 Source #

data IntLiteral a Source #

Constructors

IntLiteral 

Fields

Instances

Instances details
Functor IntLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable IntLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: IntLiteral a -> [a] #

null :: IntLiteral a -> Bool #

length :: IntLiteral a -> Int #

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

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

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

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

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

Traversable IntLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching IntLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal IntLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (IntLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 IntLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 IntLiteral :: k -> Type #

Methods

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

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

type Rep (IntLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousImport = Token "import" 5 Source #

data ImaginaryLiteral a Source #

Constructors

ImaginaryLiteral 

Fields

Instances

Instances details
Functor ImaginaryLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable ImaginaryLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: ImaginaryLiteral a -> [a] #

null :: ImaginaryLiteral a -> Bool #

length :: ImaginaryLiteral a -> Int #

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

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

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

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

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

Traversable ImaginaryLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching ImaginaryLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ImaginaryLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (ImaginaryLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 ImaginaryLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ImaginaryLiteral :: k -> Type #

Methods

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

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

type Rep (ImaginaryLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousIf = Token "if" 49 Source #

data Identifier a Source #

Constructors

Identifier 

Fields

Instances

Instances details
Functor Identifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable Identifier Source # 
Instance details

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

Unmarshal Identifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (Identifier a) Source # 
Instance details

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

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

type Rep1 Identifier = D1 ('MetaData "Identifier" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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)))

type AnonymousGoto = Token "goto" 45 Source #

type AnonymousGo = Token "go" 47 Source #

type AnonymousFunc = Token "func" 14 Source #

type AnonymousFor = Token "for" 51 Source #

data FloatLiteral a Source #

Constructors

FloatLiteral 

Fields

Instances

Instances details
Functor FloatLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable FloatLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: FloatLiteral a -> [a] #

null :: FloatLiteral a -> Bool #

length :: FloatLiteral a -> Int #

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

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

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

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

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

Traversable FloatLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching FloatLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FloatLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (FloatLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 FloatLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 FloatLiteral :: k -> Type #

Methods

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

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

type Rep (FloatLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

data FieldIdentifier a Source #

Constructors

FieldIdentifier 

Fields

Instances

Instances details
Functor FieldIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable FieldIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: FieldIdentifier a -> [a] #

null :: FieldIdentifier a -> Bool #

length :: FieldIdentifier a -> Int #

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

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

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

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

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

Traversable FieldIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching FieldIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FieldIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (FieldIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 FieldIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 FieldIdentifier :: k -> Type #

Methods

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

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

type Rep (FieldIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

data False a Source #

Constructors

False 

Fields

Instances

Instances details
Functor False Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable False Source # 
Instance details

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

Methods

symbolMatch :: Proxy False -> Node -> Bool

showFailure :: Proxy False -> Node -> String

Unmarshal False Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

Methods

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

show :: False a -> String #

showList :: [False a] -> ShowS #

Generic (False a) Source # 
Instance details

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

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

type Rep1 False = D1 ('MetaData "False" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 AnonymousFallthrough = Token "fallthrough" 42 Source #

data EscapeSequence a Source #

Constructors

EscapeSequence 

Fields

Instances

Instances details
Functor EscapeSequence Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable EscapeSequence Source # 
Instance details

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

Unmarshal EscapeSequence Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (EscapeSequence a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 EscapeSequence Source # 
Instance details

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

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

type Rep1 EscapeSequence = D1 ('MetaData "EscapeSequence" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 AnonymousElse = Token "else" 50 Source #

type AnonymousDefer = Token "defer" 48 Source #

type AnonymousDefault = Token "default" 55 Source #

type AnonymousContinue = Token "continue" 44 Source #

type AnonymousConst = Token "const" 10 Source #

type AnonymousChan = Token "chan" 25 Source #

type AnonymousCase = Token "case" 54 Source #

type AnonymousBreak = Token "break" 43 Source #

data BlankIdentifier a Source #

Constructors

BlankIdentifier 

Fields

Instances

Instances details
Functor BlankIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable BlankIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: BlankIdentifier a -> [a] #

null :: BlankIdentifier a -> Bool #

length :: BlankIdentifier a -> Int #

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

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

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

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

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

Traversable BlankIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching BlankIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal BlankIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (BlankIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 BlankIdentifier Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 BlankIdentifier :: k -> Type #

Methods

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

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

type Rep (BlankIdentifier a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

type AnonymousCaretEqual = Token "^=" 40 Source #

type AnonymousCaret = Token "^" 62 Source #

type AnonymousRBracket = Token "]" 19 Source #

type AnonymousLBracket = Token "[" 18 Source #

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

type AnonymousRAngleRAngle = Token ">>" 67 Source #

type AnonymousRAngleEqual = Token ">=" 75 Source #

type AnonymousRAngle = Token ">" 74 Source #

type AnonymousEqualEqual = Token "==" 70 Source #

type AnonymousEqual = Token "=" 12 Source #

type AnonymousLAngleEqual = Token "<=" 73 Source #

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

type AnonymousLAngleLAngle = Token "<<" 66 Source #

type AnonymousLAngleMinus = Token "<-" 26 Source #

type AnonymousLAngle = Token "<" 72 Source #

type AnonymousSemicolon = Token ";" 3 Source #

type AnonymousColonEqual = Token ":=" 27 Source #

type AnonymousColon = Token ":" 41 Source #

type AnonymousSlashEqual = Token "/=" 31 Source #

type AnonymousSlash = Token "/" 64 Source #

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

type AnonymousDot = Token "." 6 Source #

type AnonymousMinusEqual = Token "-=" 38 Source #

type AnonymousMinusMinus = Token "--" 29 Source #

type AnonymousMinus = Token "-" 60 Source #

type AnonymousComma = Token "," 11 Source #

type AnonymousPlusEqual = Token "+=" 37 Source #

type AnonymousPlusPlus = Token "++" 28 Source #

type AnonymousPlus = Token "+" 59 Source #

type AnonymousStarEqual = Token "*=" 30 Source #

type AnonymousStar = Token "*" 17 Source #

type AnonymousRParen = Token ")" 9 Source #

type AnonymousLParen = Token "(" 8 Source #

type AnonymousAmpersandCaretEqual = Token "&^=" 36 Source #

type AnonymousAmpersandCaret = Token "&^" 68 Source #

type AnonymousAmpersandEqual = Token "&=" 35 Source #

type AnonymousAmpersandAmpersand = Token "&&" 76 Source #

type AnonymousAmpersand = Token "&" 63 Source #

type AnonymousPercentEqual = Token "%=" 32 Source #

type AnonymousPercent = Token "%" 65 Source #

type AnonymousDQuote = Token "\"" 79 Source #

type AnonymousBangEqual = Token "!=" 71 Source #

type AnonymousBang = Token "!" 61 Source #

type AnonymousLF = Token "\n" 2 Source #

data VariadicParameterDeclaration a Source #

Constructors

VariadicParameterDeclaration 

Fields

Instances

Instances details
Functor VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Traversable VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (VariadicParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 VariadicParameterDeclaration :: k -> Type #

type Rep (VariadicParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (VariadicParameterDeclaration a) = D1 ('MetaData "VariadicParameterDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "VariadicParameterDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Identifier a))) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))
type Rep1 VariadicParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 VariadicParameterDeclaration = D1 ('MetaData "VariadicParameterDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "VariadicParameterDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 Identifier) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type))))

data VariadicArgument a Source #

Constructors

VariadicArgument 

Fields

Instances

Instances details
Functor VariadicArgument Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable VariadicArgument Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: VariadicArgument a -> [a] #

null :: VariadicArgument a -> Bool #

length :: VariadicArgument a -> Int #

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

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

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

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

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

Traversable VariadicArgument Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching VariadicArgument Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal VariadicArgument Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (VariadicArgument a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 VariadicArgument Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 VariadicArgument :: k -> Type #

Methods

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

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

type Rep (VariadicArgument a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

type Rep1 VariadicArgument = D1 ('MetaData "VariadicArgument" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "VariadicArgument" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data VarSpec a Source #

Constructors

VarSpec 

Instances

Instances details
Functor VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: VarSpec a -> [a] #

null :: VarSpec a -> Bool #

length :: VarSpec a -> Int #

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

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

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

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

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

Traversable VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy VarSpec -> Node -> Bool

showFailure :: Proxy VarSpec -> Node -> String

Unmarshal VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

Methods

compare :: VarSpec a -> VarSpec a -> Ordering #

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

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

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

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

max :: VarSpec a -> VarSpec a -> VarSpec a #

min :: VarSpec a -> VarSpec a -> VarSpec a #

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

Defined in TreeSitter.Go.AST

Methods

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

show :: VarSpec a -> String #

showList :: [VarSpec a] -> ShowS #

Generic (VarSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 VarSpec :: k -> Type #

Methods

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

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

type Rep (VarSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 VarSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

data VarDeclaration a Source #

Constructors

VarDeclaration 

Fields

Instances

Instances details
Functor VarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable VarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: VarDeclaration a -> [a] #

null :: VarDeclaration a -> Bool #

length :: VarDeclaration a -> Int #

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

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

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

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

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

Traversable VarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching VarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal VarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (VarDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 VarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 VarDeclaration :: k -> Type #

Methods

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

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

type Rep (VarDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

type Rep1 VarDeclaration = D1 ('MetaData "VarDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "VarDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 VarSpec)))

data UnaryExpression a Source #

Instances

Instances details
Functor UnaryExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable UnaryExpression Source # 
Instance details

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

Unmarshal UnaryExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (UnaryExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 UnaryExpression Source # 
Instance details

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

type Rep1 UnaryExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

data TypeSwitchStatement a Source #

Instances

Instances details
Functor TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeSwitchStatement a -> [a] #

null :: TypeSwitchStatement a -> Bool #

length :: TypeSwitchStatement a -> Int #

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

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

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

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

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

Traversable TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (TypeSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeSwitchStatement :: k -> Type #

Methods

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

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

type Rep (TypeSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

data TypeSpec a Source #

Constructors

TypeSpec 

Fields

Instances

Instances details
Functor TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeSpec a -> [a] #

null :: TypeSpec a -> Bool #

length :: TypeSpec a -> Int #

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

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

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

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

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

Traversable TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy TypeSpec -> Node -> Bool

showFailure :: Proxy TypeSpec -> Node -> String

Unmarshal TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

Methods

compare :: TypeSpec a -> TypeSpec a -> Ordering #

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

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

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

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

max :: TypeSpec a -> TypeSpec a -> TypeSpec a #

min :: TypeSpec a -> TypeSpec a -> TypeSpec a #

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

Defined in TreeSitter.Go.AST

Methods

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

show :: TypeSpec a -> String #

showList :: [TypeSpec a] -> ShowS #

Generic (TypeSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeSpec :: k -> Type #

Methods

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

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

type Rep (TypeSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (TypeSpec a) = D1 ('MetaData "TypeSpec" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeSpec" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))
type Rep1 TypeSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeSpec = D1 ('MetaData "TypeSpec" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeSpec" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 TypeIdentifier) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type))))

data TypeDeclaration a Source #

Constructors

TypeDeclaration 

Fields

Instances

Instances details
Functor TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeDeclaration a -> [a] #

null :: TypeDeclaration a -> Bool #

length :: TypeDeclaration a -> Int #

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

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

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

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

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

Traversable TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (TypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeDeclaration :: k -> Type #

Methods

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

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

type Rep (TypeDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (TypeDeclaration a) = D1 ('MetaData "TypeDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(TypeAlias :+: TypeSpec) a])))
type Rep1 TypeDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeDeclaration = D1 ('MetaData "TypeDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (TypeAlias :+: TypeSpec))))

data TypeConversionExpression a Source #

Constructors

TypeConversionExpression 

Fields

Instances

Instances details
Functor TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeConversionExpression a -> [a] #

null :: TypeConversionExpression a -> Bool #

length :: TypeConversionExpression a -> Int #

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

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

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

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

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

Traversable TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (TypeConversionExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeConversionExpression :: k -> Type #

type Rep (TypeConversionExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (TypeConversionExpression a) = D1 ('MetaData "TypeConversionExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeConversionExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)) :*: S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 TypeConversionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeConversionExpression = D1 ('MetaData "TypeConversionExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeConversionExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type) :*: S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data TypeCase a Source #

Constructors

TypeCase 

Fields

Instances

Instances details
Functor TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeCase a -> [a] #

null :: TypeCase a -> Bool #

length :: TypeCase a -> Int #

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

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

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

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

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

Traversable TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy TypeCase -> Node -> Bool

showFailure :: Proxy TypeCase -> Node -> String

Unmarshal TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

Methods

compare :: TypeCase a -> TypeCase a -> Ordering #

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

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

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

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

max :: TypeCase a -> TypeCase a -> TypeCase a #

min :: TypeCase a -> TypeCase a -> TypeCase a #

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

Defined in TreeSitter.Go.AST

Methods

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

show :: TypeCase a -> String #

showList :: [TypeCase a] -> ShowS #

Generic (TypeCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeCase :: k -> Type #

Methods

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

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

type Rep (TypeCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (TypeCase a) = D1 ('MetaData "TypeCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((AnonymousComma :+: Type) a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Statement a]))))
type Rep1 TypeCase Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeCase = D1 ('MetaData "TypeCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (AnonymousComma :+: Type)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement))))

data TypeAssertionExpression a Source #

Constructors

TypeAssertionExpression 

Fields

Instances

Instances details
Functor TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeAssertionExpression a -> [a] #

null :: TypeAssertionExpression a -> Bool #

length :: TypeAssertionExpression a -> Int #

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

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

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

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

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

Traversable TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (TypeAssertionExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeAssertionExpression :: k -> Type #

type Rep (TypeAssertionExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (TypeAssertionExpression a) = D1 ('MetaData "TypeAssertionExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeAssertionExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)) :*: S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 TypeAssertionExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeAssertionExpression = D1 ('MetaData "TypeAssertionExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeAssertionExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type) :*: S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data TypeAlias a Source #

Constructors

TypeAlias 

Fields

Instances

Instances details
Functor TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: TypeAlias a -> [a] #

null :: TypeAlias a -> Bool #

length :: TypeAlias a -> Int #

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

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

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

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

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

Traversable TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy TypeAlias -> Node -> Bool

showFailure :: Proxy TypeAlias -> Node -> String

Unmarshal TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (TypeAlias a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 TypeAlias :: k -> Type #

Methods

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

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

type Rep (TypeAlias a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (TypeAlias a) = D1 ('MetaData "TypeAlias" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeAlias" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))
type Rep1 TypeAlias Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 TypeAlias = D1 ('MetaData "TypeAlias" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "TypeAlias" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 TypeIdentifier) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type))))

data StructType a Source #

Constructors

StructType 

Instances

Instances details
Functor StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: StructType a -> [a] #

null :: StructType a -> Bool #

length :: StructType a -> Int #

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

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

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

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

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

Traversable StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (StructType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 StructType :: k -> Type #

Methods

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

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

type Rep (StructType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (StructType a) = D1 ('MetaData "StructType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "StructType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FieldDeclarationList a))))
type Rep1 StructType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 StructType = D1 ('MetaData "StructType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "StructType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 FieldDeclarationList)))

data SourceFile a Source #

Instances

Instances details
Functor SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SourceFile a -> [a] #

null :: SourceFile a -> Bool #

length :: SourceFile a -> Int #

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

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

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

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

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

Traversable SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (SourceFile a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SourceFile :: k -> Type #

Methods

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

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

type Rep (SourceFile a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SourceFile Source # 
Instance details

Defined in TreeSitter.Go.AST

data SliceType a Source #

Constructors

SliceType 

Fields

Instances

Instances details
Functor SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SliceType a -> [a] #

null :: SliceType a -> Bool #

length :: SliceType a -> Int #

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

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

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

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

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

Traversable SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy SliceType -> Node -> Bool

showFailure :: Proxy SliceType -> Node -> String

Unmarshal SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

Methods

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

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (SliceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Methods

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

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

Generic1 SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SliceType :: k -> Type #

Methods

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

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

type Rep (SliceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (SliceType a) = D1 ('MetaData "SliceType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SliceType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "element") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))
type Rep1 SliceType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SliceType = D1 ('MetaData "SliceType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SliceType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "element") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type)))

data SliceExpression a Source #

Constructors

SliceExpression 

Fields

Instances

Instances details
Functor SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Foldable SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: SliceExpression a -> [a] #

null :: SliceExpression a -> Bool #

length :: SliceExpression a -> Int #

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

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

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

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

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

Traversable SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

SymbolMatching SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (SliceExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

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

Generic1 SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SliceExpression :: k -> Type #

Methods

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

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

type Rep (SliceExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SliceExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

data ShortVarDeclaration a Source #

Constructors

ShortVarDeclaration 

Fields

Instances

Instances details
Functor ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

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

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

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

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

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

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

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

toList :: ShortVarDeclaration a -> [a] #

null :: ShortVarDeclaration a -> Bool #

length :: ShortVarDeclaration a -> Int #

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

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

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

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

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

Traversable ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

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

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

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

Defined in TreeSitter.Go.AST

Generic (ShortVarDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ShortVarDeclaration a) :: Type -> Type #

Generic1 ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ShortVarDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). ShortVarDeclaration a -> Rep1 ShortVarDeclaration a #

to1 :: forall (a :: k). Rep1 ShortVarDeclaration a -> ShortVarDeclaration a #

type Rep (ShortVarDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ShortVarDeclaration a) = D1 ('MetaData "ShortVarDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ShortVarDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ExpressionList a)) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ExpressionList a)))))
type Rep1 ShortVarDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ShortVarDeclaration = D1 ('MetaData "ShortVarDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ShortVarDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ExpressionList) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ExpressionList))))

data SendStatement a Source #

Constructors

SendStatement 

Fields

Instances

Instances details
Functor SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> SendStatement a -> SendStatement b #

(<$) :: a -> SendStatement b -> SendStatement a #

Foldable SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => SendStatement m -> m #

foldMap :: Monoid m => (a -> m) -> SendStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> SendStatement a -> m #

foldr :: (a -> b -> b) -> b -> SendStatement a -> b #

foldr' :: (a -> b -> b) -> b -> SendStatement a -> b #

foldl :: (b -> a -> b) -> b -> SendStatement a -> b #

foldl' :: (b -> a -> b) -> b -> SendStatement a -> b #

foldr1 :: (a -> a -> a) -> SendStatement a -> a #

foldl1 :: (a -> a -> a) -> SendStatement a -> a #

toList :: SendStatement a -> [a] #

null :: SendStatement a -> Bool #

length :: SendStatement a -> Int #

elem :: Eq a => a -> SendStatement a -> Bool #

maximum :: Ord a => SendStatement a -> a #

minimum :: Ord a => SendStatement a -> a #

sum :: Num a => SendStatement a -> a #

product :: Num a => SendStatement a -> a #

Traversable SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> SendStatement a -> f (SendStatement b) #

sequenceA :: Applicative f => SendStatement (f a) -> f (SendStatement a) #

mapM :: Monad m => (a -> m b) -> SendStatement a -> m (SendStatement b) #

sequence :: Monad m => SendStatement (m a) -> m (SendStatement a) #

SymbolMatching SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (SendStatement a)

Eq a => Eq (SendStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (SendStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (SendStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (SendStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (SendStatement a) :: Type -> Type #

Generic1 SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SendStatement :: k -> Type #

Methods

from1 :: forall (a :: k). SendStatement a -> Rep1 SendStatement a #

to1 :: forall (a :: k). Rep1 SendStatement a -> SendStatement a #

type Rep (SendStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (SendStatement a) = D1 ('MetaData "SendStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SendStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "channel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 SendStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SendStatement = D1 ('MetaData "SendStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SendStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "channel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data SelectorExpression a Source #

Constructors

SelectorExpression 

Fields

Instances

Instances details
Functor SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => SelectorExpression m -> m #

foldMap :: Monoid m => (a -> m) -> SelectorExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> SelectorExpression a -> m #

foldr :: (a -> b -> b) -> b -> SelectorExpression a -> b #

foldr' :: (a -> b -> b) -> b -> SelectorExpression a -> b #

foldl :: (b -> a -> b) -> b -> SelectorExpression a -> b #

foldl' :: (b -> a -> b) -> b -> SelectorExpression a -> b #

foldr1 :: (a -> a -> a) -> SelectorExpression a -> a #

foldl1 :: (a -> a -> a) -> SelectorExpression a -> a #

toList :: SelectorExpression a -> [a] #

null :: SelectorExpression a -> Bool #

length :: SelectorExpression a -> Int #

elem :: Eq a => a -> SelectorExpression a -> Bool #

maximum :: Ord a => SelectorExpression a -> a #

minimum :: Ord a => SelectorExpression a -> a #

sum :: Num a => SelectorExpression a -> a #

product :: Num a => SelectorExpression a -> a #

Traversable SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (SelectorExpression a)

Eq a => Eq (SelectorExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (SelectorExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (SelectorExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (SelectorExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (SelectorExpression a) :: Type -> Type #

Generic1 SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SelectorExpression :: k -> Type #

Methods

from1 :: forall (a :: k). SelectorExpression a -> Rep1 SelectorExpression a #

to1 :: forall (a :: k). Rep1 SelectorExpression a -> SelectorExpression a #

type Rep (SelectorExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (SelectorExpression a) = D1 ('MetaData "SelectorExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SelectorExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "field") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FieldIdentifier a)) :*: S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 SelectorExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SelectorExpression = D1 ('MetaData "SelectorExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SelectorExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "field") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 FieldIdentifier) :*: S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data SelectStatement a Source #

Constructors

SelectStatement 

Instances

Instances details
Functor SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> SelectStatement a -> SelectStatement b #

(<$) :: a -> SelectStatement b -> SelectStatement a #

Foldable SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => SelectStatement m -> m #

foldMap :: Monoid m => (a -> m) -> SelectStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> SelectStatement a -> m #

foldr :: (a -> b -> b) -> b -> SelectStatement a -> b #

foldr' :: (a -> b -> b) -> b -> SelectStatement a -> b #

foldl :: (b -> a -> b) -> b -> SelectStatement a -> b #

foldl' :: (b -> a -> b) -> b -> SelectStatement a -> b #

foldr1 :: (a -> a -> a) -> SelectStatement a -> a #

foldl1 :: (a -> a -> a) -> SelectStatement a -> a #

toList :: SelectStatement a -> [a] #

null :: SelectStatement a -> Bool #

length :: SelectStatement a -> Int #

elem :: Eq a => a -> SelectStatement a -> Bool #

maximum :: Ord a => SelectStatement a -> a #

minimum :: Ord a => SelectStatement a -> a #

sum :: Num a => SelectStatement a -> a #

product :: Num a => SelectStatement a -> a #

Traversable SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> SelectStatement a -> f (SelectStatement b) #

sequenceA :: Applicative f => SelectStatement (f a) -> f (SelectStatement a) #

mapM :: Monad m => (a -> m b) -> SelectStatement a -> m (SelectStatement b) #

sequence :: Monad m => SelectStatement (m a) -> m (SelectStatement a) #

SymbolMatching SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (SelectStatement a)

Eq a => Eq (SelectStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (SelectStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (SelectStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (SelectStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (SelectStatement a) :: Type -> Type #

Generic1 SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SelectStatement :: k -> Type #

Methods

from1 :: forall (a :: k). SelectStatement a -> Rep1 SelectStatement a #

to1 :: forall (a :: k). Rep1 SelectStatement a -> SelectStatement a #

type Rep (SelectStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (SelectStatement a) = D1 ('MetaData "SelectStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SelectStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(CommunicationCase :+: DefaultCase) a])))
type Rep1 SelectStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SelectStatement = D1 ('MetaData "SelectStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "SelectStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (CommunicationCase :+: DefaultCase))))

data ReturnStatement a Source #

Constructors

ReturnStatement 

Fields

Instances

Instances details
Functor ReturnStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ReturnStatement a -> ReturnStatement b #

(<$) :: a -> ReturnStatement b -> ReturnStatement a #

Foldable ReturnStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal ReturnStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ReturnStatement a)

Eq a => Eq (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ReturnStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ReturnStatement a) :: Type -> Type #

Generic1 ReturnStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (ReturnStatement a) = D1 ('MetaData "ReturnStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 (ExpressionList a)))))
type Rep1 ReturnStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ReturnStatement = D1 ('MetaData "ReturnStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 ExpressionList)))

data ReceiveStatement a Source #

Constructors

ReceiveStatement 

Fields

Instances

Instances details
Functor ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ReceiveStatement a -> ReceiveStatement b #

(<$) :: a -> ReceiveStatement b -> ReceiveStatement a #

Foldable ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ReceiveStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ReceiveStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ReceiveStatement a -> m #

foldr :: (a -> b -> b) -> b -> ReceiveStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ReceiveStatement a -> b #

foldl :: (b -> a -> b) -> b -> ReceiveStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ReceiveStatement a -> b #

foldr1 :: (a -> a -> a) -> ReceiveStatement a -> a #

foldl1 :: (a -> a -> a) -> ReceiveStatement a -> a #

toList :: ReceiveStatement a -> [a] #

null :: ReceiveStatement a -> Bool #

length :: ReceiveStatement a -> Int #

elem :: Eq a => a -> ReceiveStatement a -> Bool #

maximum :: Ord a => ReceiveStatement a -> a #

minimum :: Ord a => ReceiveStatement a -> a #

sum :: Num a => ReceiveStatement a -> a #

product :: Num a => ReceiveStatement a -> a #

Traversable ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ReceiveStatement a -> f (ReceiveStatement b) #

sequenceA :: Applicative f => ReceiveStatement (f a) -> f (ReceiveStatement a) #

mapM :: Monad m => (a -> m b) -> ReceiveStatement a -> m (ReceiveStatement b) #

sequence :: Monad m => ReceiveStatement (m a) -> m (ReceiveStatement a) #

SymbolMatching ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ReceiveStatement a)

Eq a => Eq (ReceiveStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ReceiveStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ReceiveStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ReceiveStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ReceiveStatement a) :: Type -> Type #

Generic1 ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ReceiveStatement :: k -> Type #

Methods

from1 :: forall (a :: k). ReceiveStatement a -> Rep1 ReceiveStatement a #

to1 :: forall (a :: k). Rep1 ReceiveStatement a -> ReceiveStatement a #

type Rep (ReceiveStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ReceiveStatement a) = D1 ('MetaData "ReceiveStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ReceiveStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (ExpressionList a))) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 ReceiveStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ReceiveStatement = D1 ('MetaData "ReceiveStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ReceiveStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 ExpressionList) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data RangeClause a Source #

Constructors

RangeClause 

Fields

Instances

Instances details
Functor RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> RangeClause a -> RangeClause b #

(<$) :: a -> RangeClause b -> RangeClause a #

Foldable RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => RangeClause m -> m #

foldMap :: Monoid m => (a -> m) -> RangeClause a -> m #

foldMap' :: Monoid m => (a -> m) -> RangeClause a -> m #

foldr :: (a -> b -> b) -> b -> RangeClause a -> b #

foldr' :: (a -> b -> b) -> b -> RangeClause a -> b #

foldl :: (b -> a -> b) -> b -> RangeClause a -> b #

foldl' :: (b -> a -> b) -> b -> RangeClause a -> b #

foldr1 :: (a -> a -> a) -> RangeClause a -> a #

foldl1 :: (a -> a -> a) -> RangeClause a -> a #

toList :: RangeClause a -> [a] #

null :: RangeClause a -> Bool #

length :: RangeClause a -> Int #

elem :: Eq a => a -> RangeClause a -> Bool #

maximum :: Ord a => RangeClause a -> a #

minimum :: Ord a => RangeClause a -> a #

sum :: Num a => RangeClause a -> a #

product :: Num a => RangeClause a -> a #

Traversable RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> RangeClause a -> f (RangeClause b) #

sequenceA :: Applicative f => RangeClause (f a) -> f (RangeClause a) #

mapM :: Monad m => (a -> m b) -> RangeClause a -> m (RangeClause b) #

sequence :: Monad m => RangeClause (m a) -> m (RangeClause a) #

SymbolMatching RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (RangeClause a)

Eq a => Eq (RangeClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (RangeClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (RangeClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (RangeClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (RangeClause a) :: Type -> Type #

Methods

from :: RangeClause a -> Rep (RangeClause a) x #

to :: Rep (RangeClause a) x -> RangeClause a #

Generic1 RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 RangeClause :: k -> Type #

Methods

from1 :: forall (a :: k). RangeClause a -> Rep1 RangeClause a #

to1 :: forall (a :: k). Rep1 RangeClause a -> RangeClause a #

type Rep (RangeClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (RangeClause a) = D1 ('MetaData "RangeClause" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "RangeClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "left") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (ExpressionList a))) :*: S1 ('MetaSel ('Just "right") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 RangeClause Source # 
Instance details

Defined in TreeSitter.Go.AST

data QualifiedType a Source #

Constructors

QualifiedType 

Fields

Instances

Instances details
Functor QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> QualifiedType a -> QualifiedType b #

(<$) :: a -> QualifiedType b -> QualifiedType a #

Foldable QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => QualifiedType m -> m #

foldMap :: Monoid m => (a -> m) -> QualifiedType a -> m #

foldMap' :: Monoid m => (a -> m) -> QualifiedType a -> m #

foldr :: (a -> b -> b) -> b -> QualifiedType a -> b #

foldr' :: (a -> b -> b) -> b -> QualifiedType a -> b #

foldl :: (b -> a -> b) -> b -> QualifiedType a -> b #

foldl' :: (b -> a -> b) -> b -> QualifiedType a -> b #

foldr1 :: (a -> a -> a) -> QualifiedType a -> a #

foldl1 :: (a -> a -> a) -> QualifiedType a -> a #

toList :: QualifiedType a -> [a] #

null :: QualifiedType a -> Bool #

length :: QualifiedType a -> Int #

elem :: Eq a => a -> QualifiedType a -> Bool #

maximum :: Ord a => QualifiedType a -> a #

minimum :: Ord a => QualifiedType a -> a #

sum :: Num a => QualifiedType a -> a #

product :: Num a => QualifiedType a -> a #

Traversable QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> QualifiedType a -> f (QualifiedType b) #

sequenceA :: Applicative f => QualifiedType (f a) -> f (QualifiedType a) #

mapM :: Monad m => (a -> m b) -> QualifiedType a -> m (QualifiedType b) #

sequence :: Monad m => QualifiedType (m a) -> m (QualifiedType a) #

SymbolMatching QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (QualifiedType a)

Eq a => Eq (QualifiedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (QualifiedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (QualifiedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (QualifiedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (QualifiedType a) :: Type -> Type #

Generic1 QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 QualifiedType :: k -> Type #

Methods

from1 :: forall (a :: k). QualifiedType a -> Rep1 QualifiedType a #

to1 :: forall (a :: k). Rep1 QualifiedType a -> QualifiedType a #

type Rep (QualifiedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (QualifiedType a) = D1 ('MetaData "QualifiedType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "QualifiedType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TypeIdentifier a)) :*: S1 ('MetaSel ('Just "package") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PackageIdentifier a)))))
type Rep1 QualifiedType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 QualifiedType = D1 ('MetaData "QualifiedType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "QualifiedType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 TypeIdentifier) :*: S1 ('MetaSel ('Just "package") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 PackageIdentifier))))

data PointerType a Source #

Constructors

PointerType 

Fields

Instances

Instances details
Functor PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> PointerType a -> PointerType b #

(<$) :: a -> PointerType b -> PointerType a #

Foldable PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => PointerType m -> m #

foldMap :: Monoid m => (a -> m) -> PointerType a -> m #

foldMap' :: Monoid m => (a -> m) -> PointerType a -> m #

foldr :: (a -> b -> b) -> b -> PointerType a -> b #

foldr' :: (a -> b -> b) -> b -> PointerType a -> b #

foldl :: (b -> a -> b) -> b -> PointerType a -> b #

foldl' :: (b -> a -> b) -> b -> PointerType a -> b #

foldr1 :: (a -> a -> a) -> PointerType a -> a #

foldl1 :: (a -> a -> a) -> PointerType a -> a #

toList :: PointerType a -> [a] #

null :: PointerType a -> Bool #

length :: PointerType a -> Int #

elem :: Eq a => a -> PointerType a -> Bool #

maximum :: Ord a => PointerType a -> a #

minimum :: Ord a => PointerType a -> a #

sum :: Num a => PointerType a -> a #

product :: Num a => PointerType a -> a #

Traversable PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> PointerType a -> f (PointerType b) #

sequenceA :: Applicative f => PointerType (f a) -> f (PointerType a) #

mapM :: Monad m => (a -> m b) -> PointerType a -> m (PointerType b) #

sequence :: Monad m => PointerType (m a) -> m (PointerType a) #

SymbolMatching PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (PointerType a)

Eq a => Eq (PointerType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (PointerType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (PointerType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (PointerType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (PointerType a) :: Type -> Type #

Methods

from :: PointerType a -> Rep (PointerType a) x #

to :: Rep (PointerType a) x -> PointerType a #

Generic1 PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 PointerType :: k -> Type #

Methods

from1 :: forall (a :: k). PointerType a -> Rep1 PointerType a #

to1 :: forall (a :: k). Rep1 PointerType a -> PointerType a #

type Rep (PointerType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (PointerType a) = D1 ('MetaData "PointerType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "PointerType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))
type Rep1 PointerType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 PointerType = D1 ('MetaData "PointerType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "PointerType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type)))

data ParenthesizedType a Source #

Constructors

ParenthesizedType 

Fields

Instances

Instances details
Functor ParenthesizedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ParenthesizedType Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal ParenthesizedType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ParenthesizedType a)

Eq a => Eq (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ParenthesizedType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ParenthesizedType a) :: Type -> Type #

Generic1 ParenthesizedType Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (ParenthesizedType a) = D1 ('MetaData "ParenthesizedType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParenthesizedType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))
type Rep1 ParenthesizedType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ParenthesizedType = D1 ('MetaData "ParenthesizedType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParenthesizedType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type)))

data ParenthesizedExpression a Source #

Constructors

ParenthesizedExpression 

Fields

Instances

Instances details
Functor ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

SymbolMatching ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ParenthesizedExpression a)

Eq a => Eq (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ParenthesizedExpression a) :: Type -> Type #

Generic1 ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ParenthesizedExpression :: k -> Type #

type Rep (ParenthesizedExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ParenthesizedExpression a) = D1 ('MetaData "ParenthesizedExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 (Expression a))))
type Rep1 ParenthesizedExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ParenthesizedExpression = D1 ('MetaData "ParenthesizedExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParenthesizedExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data ParameterList a Source #

Instances

Instances details
Functor ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ParameterList a -> ParameterList b #

(<$) :: a -> ParameterList b -> ParameterList a #

Foldable ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ParameterList m -> m #

foldMap :: Monoid m => (a -> m) -> ParameterList a -> m #

foldMap' :: Monoid m => (a -> m) -> ParameterList a -> m #

foldr :: (a -> b -> b) -> b -> ParameterList a -> b #

foldr' :: (a -> b -> b) -> b -> ParameterList a -> b #

foldl :: (b -> a -> b) -> b -> ParameterList a -> b #

foldl' :: (b -> a -> b) -> b -> ParameterList a -> b #

foldr1 :: (a -> a -> a) -> ParameterList a -> a #

foldl1 :: (a -> a -> a) -> ParameterList a -> a #

toList :: ParameterList a -> [a] #

null :: ParameterList a -> Bool #

length :: ParameterList a -> Int #

elem :: Eq a => a -> ParameterList a -> Bool #

maximum :: Ord a => ParameterList a -> a #

minimum :: Ord a => ParameterList a -> a #

sum :: Num a => ParameterList a -> a #

product :: Num a => ParameterList a -> a #

Traversable ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ParameterList a -> f (ParameterList b) #

sequenceA :: Applicative f => ParameterList (f a) -> f (ParameterList a) #

mapM :: Monad m => (a -> m b) -> ParameterList a -> m (ParameterList b) #

sequence :: Monad m => ParameterList (m a) -> m (ParameterList a) #

SymbolMatching ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ParameterList a)

Eq a => Eq (ParameterList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ParameterList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ParameterList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ParameterList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ParameterList a) :: Type -> Type #

Generic1 ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ParameterList :: k -> Type #

Methods

from1 :: forall (a :: k). ParameterList a -> Rep1 ParameterList a #

to1 :: forall (a :: k). Rep1 ParameterList a -> ParameterList a #

type Rep (ParameterList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ParameterList a) = D1 ('MetaData "ParameterList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParameterList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ParameterDeclaration :+: VariadicParameterDeclaration) a])))
type Rep1 ParameterList Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ParameterList = D1 ('MetaData "ParameterList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParameterList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (ParameterDeclaration :+: VariadicParameterDeclaration))))

data ParameterDeclaration a Source #

Constructors

ParameterDeclaration 

Fields

Instances

Instances details
Functor ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ParameterDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ParameterDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> ParameterDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ParameterDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ParameterDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ParameterDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ParameterDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ParameterDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ParameterDeclaration a -> a #

toList :: ParameterDeclaration a -> [a] #

null :: ParameterDeclaration a -> Bool #

length :: ParameterDeclaration a -> Int #

elem :: Eq a => a -> ParameterDeclaration a -> Bool #

maximum :: Ord a => ParameterDeclaration a -> a #

minimum :: Ord a => ParameterDeclaration a -> a #

sum :: Num a => ParameterDeclaration a -> a #

product :: Num a => ParameterDeclaration a -> a #

Traversable ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ParameterDeclaration a)

Eq a => Eq (ParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ParameterDeclaration a) :: Type -> Type #

Generic1 ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ParameterDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). ParameterDeclaration a -> Rep1 ParameterDeclaration a #

to1 :: forall (a :: k). Rep1 ParameterDeclaration a -> ParameterDeclaration a #

type Rep (ParameterDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ParameterDeclaration a) = D1 ('MetaData "ParameterDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParameterDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(AnonymousComma :+: Identifier) a]) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))
type Rep1 ParameterDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ParameterDeclaration = D1 ('MetaData "ParameterDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ParameterDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (AnonymousComma :+: Identifier)) :*: S1 ('MetaSel ('Just "type'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type))))

data PackageClause a Source #

Constructors

PackageClause 

Fields

Instances

Instances details
Functor PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> PackageClause a -> PackageClause b #

(<$) :: a -> PackageClause b -> PackageClause a #

Foldable PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => PackageClause m -> m #

foldMap :: Monoid m => (a -> m) -> PackageClause a -> m #

foldMap' :: Monoid m => (a -> m) -> PackageClause a -> m #

foldr :: (a -> b -> b) -> b -> PackageClause a -> b #

foldr' :: (a -> b -> b) -> b -> PackageClause a -> b #

foldl :: (b -> a -> b) -> b -> PackageClause a -> b #

foldl' :: (b -> a -> b) -> b -> PackageClause a -> b #

foldr1 :: (a -> a -> a) -> PackageClause a -> a #

foldl1 :: (a -> a -> a) -> PackageClause a -> a #

toList :: PackageClause a -> [a] #

null :: PackageClause a -> Bool #

length :: PackageClause a -> Int #

elem :: Eq a => a -> PackageClause a -> Bool #

maximum :: Ord a => PackageClause a -> a #

minimum :: Ord a => PackageClause a -> a #

sum :: Num a => PackageClause a -> a #

product :: Num a => PackageClause a -> a #

Traversable PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> PackageClause a -> f (PackageClause b) #

sequenceA :: Applicative f => PackageClause (f a) -> f (PackageClause a) #

mapM :: Monad m => (a -> m b) -> PackageClause a -> m (PackageClause b) #

sequence :: Monad m => PackageClause (m a) -> m (PackageClause a) #

SymbolMatching PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (PackageClause a)

Eq a => Eq (PackageClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (PackageClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (PackageClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (PackageClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (PackageClause a) :: Type -> Type #

Generic1 PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 PackageClause :: k -> Type #

Methods

from1 :: forall (a :: k). PackageClause a -> Rep1 PackageClause a #

to1 :: forall (a :: k). Rep1 PackageClause a -> PackageClause a #

type Rep (PackageClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (PackageClause a) = D1 ('MetaData "PackageClause" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "PackageClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PackageIdentifier a))))
type Rep1 PackageClause Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 PackageClause = D1 ('MetaData "PackageClause" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "PackageClause" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 PackageIdentifier)))

data MethodSpecList a Source #

Instances

Instances details
Functor MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> MethodSpecList a -> MethodSpecList b #

(<$) :: a -> MethodSpecList b -> MethodSpecList a #

Foldable MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => MethodSpecList m -> m #

foldMap :: Monoid m => (a -> m) -> MethodSpecList a -> m #

foldMap' :: Monoid m => (a -> m) -> MethodSpecList a -> m #

foldr :: (a -> b -> b) -> b -> MethodSpecList a -> b #

foldr' :: (a -> b -> b) -> b -> MethodSpecList a -> b #

foldl :: (b -> a -> b) -> b -> MethodSpecList a -> b #

foldl' :: (b -> a -> b) -> b -> MethodSpecList a -> b #

foldr1 :: (a -> a -> a) -> MethodSpecList a -> a #

foldl1 :: (a -> a -> a) -> MethodSpecList a -> a #

toList :: MethodSpecList a -> [a] #

null :: MethodSpecList a -> Bool #

length :: MethodSpecList a -> Int #

elem :: Eq a => a -> MethodSpecList a -> Bool #

maximum :: Ord a => MethodSpecList a -> a #

minimum :: Ord a => MethodSpecList a -> a #

sum :: Num a => MethodSpecList a -> a #

product :: Num a => MethodSpecList a -> a #

Traversable MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> MethodSpecList a -> f (MethodSpecList b) #

sequenceA :: Applicative f => MethodSpecList (f a) -> f (MethodSpecList a) #

mapM :: Monad m => (a -> m b) -> MethodSpecList a -> m (MethodSpecList b) #

sequence :: Monad m => MethodSpecList (m a) -> m (MethodSpecList a) #

SymbolMatching MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (MethodSpecList a)

Eq a => Eq (MethodSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (MethodSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (MethodSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (MethodSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (MethodSpecList a) :: Type -> Type #

Generic1 MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 MethodSpecList :: k -> Type #

Methods

from1 :: forall (a :: k). MethodSpecList a -> Rep1 MethodSpecList a #

to1 :: forall (a :: k). Rep1 MethodSpecList a -> MethodSpecList a #

type Rep (MethodSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (MethodSpecList a) = D1 ('MetaData "MethodSpecList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "MethodSpecList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(MethodSpec :+: (QualifiedType :+: TypeIdentifier)) a])))
type Rep1 MethodSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 MethodSpecList = D1 ('MetaData "MethodSpecList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "MethodSpecList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (MethodSpec :+: (QualifiedType :+: TypeIdentifier)))))

data MethodSpec a Source #

Instances

Instances details
Functor MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> MethodSpec a -> MethodSpec b #

(<$) :: a -> MethodSpec b -> MethodSpec a #

Foldable MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => MethodSpec m -> m #

foldMap :: Monoid m => (a -> m) -> MethodSpec a -> m #

foldMap' :: Monoid m => (a -> m) -> MethodSpec a -> m #

foldr :: (a -> b -> b) -> b -> MethodSpec a -> b #

foldr' :: (a -> b -> b) -> b -> MethodSpec a -> b #

foldl :: (b -> a -> b) -> b -> MethodSpec a -> b #

foldl' :: (b -> a -> b) -> b -> MethodSpec a -> b #

foldr1 :: (a -> a -> a) -> MethodSpec a -> a #

foldl1 :: (a -> a -> a) -> MethodSpec a -> a #

toList :: MethodSpec a -> [a] #

null :: MethodSpec a -> Bool #

length :: MethodSpec a -> Int #

elem :: Eq a => a -> MethodSpec a -> Bool #

maximum :: Ord a => MethodSpec a -> a #

minimum :: Ord a => MethodSpec a -> a #

sum :: Num a => MethodSpec a -> a #

product :: Num a => MethodSpec a -> a #

Traversable MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> MethodSpec a -> f (MethodSpec b) #

sequenceA :: Applicative f => MethodSpec (f a) -> f (MethodSpec a) #

mapM :: Monad m => (a -> m b) -> MethodSpec a -> m (MethodSpec b) #

sequence :: Monad m => MethodSpec (m a) -> m (MethodSpec a) #

SymbolMatching MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (MethodSpec a)

Eq a => Eq (MethodSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: MethodSpec a -> MethodSpec a -> Bool #

(/=) :: MethodSpec a -> MethodSpec a -> Bool #

Ord a => Ord (MethodSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (MethodSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (MethodSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (MethodSpec a) :: Type -> Type #

Methods

from :: MethodSpec a -> Rep (MethodSpec a) x #

to :: Rep (MethodSpec a) x -> MethodSpec a #

Generic1 MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 MethodSpec :: k -> Type #

Methods

from1 :: forall (a :: k). MethodSpec a -> Rep1 MethodSpec a #

to1 :: forall (a :: k). Rep1 MethodSpec a -> MethodSpec a #

type Rep (MethodSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 MethodSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

data MethodDeclaration a Source #

Instances

Instances details
Functor MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => MethodDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> MethodDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> MethodDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> MethodDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> MethodDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> MethodDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> MethodDeclaration a -> b #

foldr1 :: (a -> a -> a) -> MethodDeclaration a -> a #

foldl1 :: (a -> a -> a) -> MethodDeclaration a -> a #

toList :: MethodDeclaration a -> [a] #

null :: MethodDeclaration a -> Bool #

length :: MethodDeclaration a -> Int #

elem :: Eq a => a -> MethodDeclaration a -> Bool #

maximum :: Ord a => MethodDeclaration a -> a #

minimum :: Ord a => MethodDeclaration a -> a #

sum :: Num a => MethodDeclaration a -> a #

product :: Num a => MethodDeclaration a -> a #

Traversable MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> MethodDeclaration a -> f (MethodDeclaration b) #

sequenceA :: Applicative f => MethodDeclaration (f a) -> f (MethodDeclaration a) #

mapM :: Monad m => (a -> m b) -> MethodDeclaration a -> m (MethodDeclaration b) #

sequence :: Monad m => MethodDeclaration (m a) -> m (MethodDeclaration a) #

SymbolMatching MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (MethodDeclaration a)

Eq a => Eq (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (MethodDeclaration a) :: Type -> Type #

Generic1 MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 MethodDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). MethodDeclaration a -> Rep1 MethodDeclaration a #

to1 :: forall (a :: k). Rep1 MethodDeclaration a -> MethodDeclaration a #

type Rep (MethodDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 MethodDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

data MapType a Source #

Constructors

MapType 

Fields

Instances

Instances details
Functor MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> MapType a -> MapType b #

(<$) :: a -> MapType b -> MapType a #

Foldable MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => MapType m -> m #

foldMap :: Monoid m => (a -> m) -> MapType a -> m #

foldMap' :: Monoid m => (a -> m) -> MapType a -> m #

foldr :: (a -> b -> b) -> b -> MapType a -> b #

foldr' :: (a -> b -> b) -> b -> MapType a -> b #

foldl :: (b -> a -> b) -> b -> MapType a -> b #

foldl' :: (b -> a -> b) -> b -> MapType a -> b #

foldr1 :: (a -> a -> a) -> MapType a -> a #

foldl1 :: (a -> a -> a) -> MapType a -> a #

toList :: MapType a -> [a] #

null :: MapType a -> Bool #

length :: MapType a -> Int #

elem :: Eq a => a -> MapType a -> Bool #

maximum :: Ord a => MapType a -> a #

minimum :: Ord a => MapType a -> a #

sum :: Num a => MapType a -> a #

product :: Num a => MapType a -> a #

Traversable MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> MapType a -> f (MapType b) #

sequenceA :: Applicative f => MapType (f a) -> f (MapType a) #

mapM :: Monad m => (a -> m b) -> MapType a -> m (MapType b) #

sequence :: Monad m => MapType (m a) -> m (MapType a) #

SymbolMatching MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy MapType -> Node -> Bool

showFailure :: Proxy MapType -> Node -> String

Unmarshal MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (MapType a)

Eq a => Eq (MapType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: MapType a -> MapType a -> Bool #

(/=) :: MapType a -> MapType a -> Bool #

Ord a => Ord (MapType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

compare :: MapType a -> MapType a -> Ordering #

(<) :: MapType a -> MapType a -> Bool #

(<=) :: MapType a -> MapType a -> Bool #

(>) :: MapType a -> MapType a -> Bool #

(>=) :: MapType a -> MapType a -> Bool #

max :: MapType a -> MapType a -> MapType a #

min :: MapType a -> MapType a -> MapType a #

Show a => Show (MapType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

showsPrec :: Int -> MapType a -> ShowS #

show :: MapType a -> String #

showList :: [MapType a] -> ShowS #

Generic (MapType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (MapType a) :: Type -> Type #

Methods

from :: MapType a -> Rep (MapType a) x #

to :: Rep (MapType a) x -> MapType a #

Generic1 MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 MapType :: k -> Type #

Methods

from1 :: forall (a :: k). MapType a -> Rep1 MapType a #

to1 :: forall (a :: k). Rep1 MapType a -> MapType a #

type Rep (MapType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (MapType a) = D1 ('MetaData "MapType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "MapType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)) :*: S1 ('MetaSel ('Just "key") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))
type Rep1 MapType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 MapType = D1 ('MetaData "MapType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "MapType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type) :*: S1 ('MetaSel ('Just "key") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type))))

data LiteralValue a Source #

Constructors

LiteralValue 

Fields

Instances

Instances details
Functor LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> LiteralValue a -> LiteralValue b #

(<$) :: a -> LiteralValue b -> LiteralValue a #

Foldable LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => LiteralValue m -> m #

foldMap :: Monoid m => (a -> m) -> LiteralValue a -> m #

foldMap' :: Monoid m => (a -> m) -> LiteralValue a -> m #

foldr :: (a -> b -> b) -> b -> LiteralValue a -> b #

foldr' :: (a -> b -> b) -> b -> LiteralValue a -> b #

foldl :: (b -> a -> b) -> b -> LiteralValue a -> b #

foldl' :: (b -> a -> b) -> b -> LiteralValue a -> b #

foldr1 :: (a -> a -> a) -> LiteralValue a -> a #

foldl1 :: (a -> a -> a) -> LiteralValue a -> a #

toList :: LiteralValue a -> [a] #

null :: LiteralValue a -> Bool #

length :: LiteralValue a -> Int #

elem :: Eq a => a -> LiteralValue a -> Bool #

maximum :: Ord a => LiteralValue a -> a #

minimum :: Ord a => LiteralValue a -> a #

sum :: Num a => LiteralValue a -> a #

product :: Num a => LiteralValue a -> a #

Traversable LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> LiteralValue a -> f (LiteralValue b) #

sequenceA :: Applicative f => LiteralValue (f a) -> f (LiteralValue a) #

mapM :: Monad m => (a -> m b) -> LiteralValue a -> m (LiteralValue b) #

sequence :: Monad m => LiteralValue (m a) -> m (LiteralValue a) #

SymbolMatching LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (LiteralValue a)

Eq a => Eq (LiteralValue a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (LiteralValue a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (LiteralValue a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (LiteralValue a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (LiteralValue a) :: Type -> Type #

Methods

from :: LiteralValue a -> Rep (LiteralValue a) x #

to :: Rep (LiteralValue a) x -> LiteralValue a #

Generic1 LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 LiteralValue :: k -> Type #

Methods

from1 :: forall (a :: k). LiteralValue a -> Rep1 LiteralValue a #

to1 :: forall (a :: k). Rep1 LiteralValue a -> LiteralValue a #

type Rep (LiteralValue a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (LiteralValue a) = D1 ('MetaData "LiteralValue" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "LiteralValue" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Element :+: KeyedElement) a])))
type Rep1 LiteralValue Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 LiteralValue = D1 ('MetaData "LiteralValue" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "LiteralValue" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (Element :+: KeyedElement))))

data LabeledStatement a Source #

Constructors

LabeledStatement 

Fields

Instances

Instances details
Functor LabeledStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> LabeledStatement a -> LabeledStatement b #

(<$) :: a -> LabeledStatement b -> LabeledStatement a #

Foldable LabeledStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal LabeledStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (LabeledStatement a)

Eq a => Eq (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (LabeledStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (LabeledStatement a) :: Type -> Type #

Generic1 LabeledStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (LabeledStatement a) = D1 ('MetaData "LabeledStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 (LabelName a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Statement a))))))
type Rep1 LabeledStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 LabeledStatement = D1 ('MetaData "LabeledStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 LabelName) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 Statement))))

data KeyedElement a Source #

Instances

Instances details
Functor KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> KeyedElement a -> KeyedElement b #

(<$) :: a -> KeyedElement b -> KeyedElement a #

Foldable KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => KeyedElement m -> m #

foldMap :: Monoid m => (a -> m) -> KeyedElement a -> m #

foldMap' :: Monoid m => (a -> m) -> KeyedElement a -> m #

foldr :: (a -> b -> b) -> b -> KeyedElement a -> b #

foldr' :: (a -> b -> b) -> b -> KeyedElement a -> b #

foldl :: (b -> a -> b) -> b -> KeyedElement a -> b #

foldl' :: (b -> a -> b) -> b -> KeyedElement a -> b #

foldr1 :: (a -> a -> a) -> KeyedElement a -> a #

foldl1 :: (a -> a -> a) -> KeyedElement a -> a #

toList :: KeyedElement a -> [a] #

null :: KeyedElement a -> Bool #

length :: KeyedElement a -> Int #

elem :: Eq a => a -> KeyedElement a -> Bool #

maximum :: Ord a => KeyedElement a -> a #

minimum :: Ord a => KeyedElement a -> a #

sum :: Num a => KeyedElement a -> a #

product :: Num a => KeyedElement a -> a #

Traversable KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> KeyedElement a -> f (KeyedElement b) #

sequenceA :: Applicative f => KeyedElement (f a) -> f (KeyedElement a) #

mapM :: Monad m => (a -> m b) -> KeyedElement a -> m (KeyedElement b) #

sequence :: Monad m => KeyedElement (m a) -> m (KeyedElement a) #

SymbolMatching KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (KeyedElement a)

Eq a => Eq (KeyedElement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (KeyedElement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (KeyedElement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (KeyedElement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (KeyedElement a) :: Type -> Type #

Methods

from :: KeyedElement a -> Rep (KeyedElement a) x #

to :: Rep (KeyedElement a) x -> KeyedElement a #

Generic1 KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 KeyedElement :: k -> Type #

Methods

from1 :: forall (a :: k). KeyedElement a -> Rep1 KeyedElement a #

to1 :: forall (a :: k). Rep1 KeyedElement a -> KeyedElement a #

type Rep (KeyedElement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (KeyedElement a) = D1 ('MetaData "KeyedElement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "KeyedElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty ((Expression :+: (FieldIdentifier :+: LiteralValue)) a)))))
type Rep1 KeyedElement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 KeyedElement = D1 ('MetaData "KeyedElement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "KeyedElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 (Expression :+: (FieldIdentifier :+: LiteralValue)))))

data InterpretedStringLiteral a Source #

Constructors

InterpretedStringLiteral 

Fields

Instances

Instances details
Functor InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => InterpretedStringLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> InterpretedStringLiteral a -> m #

foldMap' :: Monoid m => (a -> m) -> InterpretedStringLiteral a -> m #

foldr :: (a -> b -> b) -> b -> InterpretedStringLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> InterpretedStringLiteral a -> b #

foldl :: (b -> a -> b) -> b -> InterpretedStringLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> InterpretedStringLiteral a -> b #

foldr1 :: (a -> a -> a) -> InterpretedStringLiteral a -> a #

foldl1 :: (a -> a -> a) -> InterpretedStringLiteral a -> a #

toList :: InterpretedStringLiteral a -> [a] #

null :: InterpretedStringLiteral a -> Bool #

length :: InterpretedStringLiteral a -> Int #

elem :: Eq a => a -> InterpretedStringLiteral a -> Bool #

maximum :: Ord a => InterpretedStringLiteral a -> a #

minimum :: Ord a => InterpretedStringLiteral a -> a #

sum :: Num a => InterpretedStringLiteral a -> a #

product :: Num a => InterpretedStringLiteral a -> a #

Traversable InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (InterpretedStringLiteral a)

Eq a => Eq (InterpretedStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (InterpretedStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (InterpretedStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (InterpretedStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (InterpretedStringLiteral a) :: Type -> Type #

Generic1 InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 InterpretedStringLiteral :: k -> Type #

type Rep (InterpretedStringLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (InterpretedStringLiteral a) = D1 ('MetaData "InterpretedStringLiteral" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "InterpretedStringLiteral" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [EscapeSequence a])))
type Rep1 InterpretedStringLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 InterpretedStringLiteral = D1 ('MetaData "InterpretedStringLiteral" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "InterpretedStringLiteral" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 EscapeSequence)))

data InterfaceType a Source #

Constructors

InterfaceType 

Fields

Instances

Instances details
Functor InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> InterfaceType a -> InterfaceType b #

(<$) :: a -> InterfaceType b -> InterfaceType a #

Foldable InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => InterfaceType m -> m #

foldMap :: Monoid m => (a -> m) -> InterfaceType a -> m #

foldMap' :: Monoid m => (a -> m) -> InterfaceType a -> m #

foldr :: (a -> b -> b) -> b -> InterfaceType a -> b #

foldr' :: (a -> b -> b) -> b -> InterfaceType a -> b #

foldl :: (b -> a -> b) -> b -> InterfaceType a -> b #

foldl' :: (b -> a -> b) -> b -> InterfaceType a -> b #

foldr1 :: (a -> a -> a) -> InterfaceType a -> a #

foldl1 :: (a -> a -> a) -> InterfaceType a -> a #

toList :: InterfaceType a -> [a] #

null :: InterfaceType a -> Bool #

length :: InterfaceType a -> Int #

elem :: Eq a => a -> InterfaceType a -> Bool #

maximum :: Ord a => InterfaceType a -> a #

minimum :: Ord a => InterfaceType a -> a #

sum :: Num a => InterfaceType a -> a #

product :: Num a => InterfaceType a -> a #

Traversable InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> InterfaceType a -> f (InterfaceType b) #

sequenceA :: Applicative f => InterfaceType (f a) -> f (InterfaceType a) #

mapM :: Monad m => (a -> m b) -> InterfaceType a -> m (InterfaceType b) #

sequence :: Monad m => InterfaceType (m a) -> m (InterfaceType a) #

SymbolMatching InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (InterfaceType a)

Eq a => Eq (InterfaceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (InterfaceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (InterfaceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (InterfaceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (InterfaceType a) :: Type -> Type #

Generic1 InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 InterfaceType :: k -> Type #

Methods

from1 :: forall (a :: k). InterfaceType a -> Rep1 InterfaceType a #

to1 :: forall (a :: k). Rep1 InterfaceType a -> InterfaceType a #

type Rep (InterfaceType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (InterfaceType a) = D1 ('MetaData "InterfaceType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "InterfaceType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (MethodSpecList a))))
type Rep1 InterfaceType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 InterfaceType = D1 ('MetaData "InterfaceType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "InterfaceType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 MethodSpecList)))

data IndexExpression a Source #

Constructors

IndexExpression 

Fields

Instances

Instances details
Functor IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> IndexExpression a -> IndexExpression b #

(<$) :: a -> IndexExpression b -> IndexExpression a #

Foldable IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => IndexExpression m -> m #

foldMap :: Monoid m => (a -> m) -> IndexExpression a -> m #

foldMap' :: Monoid m => (a -> m) -> IndexExpression a -> m #

foldr :: (a -> b -> b) -> b -> IndexExpression a -> b #

foldr' :: (a -> b -> b) -> b -> IndexExpression a -> b #

foldl :: (b -> a -> b) -> b -> IndexExpression a -> b #

foldl' :: (b -> a -> b) -> b -> IndexExpression a -> b #

foldr1 :: (a -> a -> a) -> IndexExpression a -> a #

foldl1 :: (a -> a -> a) -> IndexExpression a -> a #

toList :: IndexExpression a -> [a] #

null :: IndexExpression a -> Bool #

length :: IndexExpression a -> Int #

elem :: Eq a => a -> IndexExpression a -> Bool #

maximum :: Ord a => IndexExpression a -> a #

minimum :: Ord a => IndexExpression a -> a #

sum :: Num a => IndexExpression a -> a #

product :: Num a => IndexExpression a -> a #

Traversable IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> IndexExpression a -> f (IndexExpression b) #

sequenceA :: Applicative f => IndexExpression (f a) -> f (IndexExpression a) #

mapM :: Monad m => (a -> m b) -> IndexExpression a -> m (IndexExpression b) #

sequence :: Monad m => IndexExpression (m a) -> m (IndexExpression a) #

SymbolMatching IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (IndexExpression a)

Eq a => Eq (IndexExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (IndexExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (IndexExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (IndexExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (IndexExpression a) :: Type -> Type #

Generic1 IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 IndexExpression :: k -> Type #

Methods

from1 :: forall (a :: k). IndexExpression a -> Rep1 IndexExpression a #

to1 :: forall (a :: k). Rep1 IndexExpression a -> IndexExpression a #

type Rep (IndexExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (IndexExpression a) = D1 ('MetaData "IndexExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "IndexExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "index") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)))))
type Rep1 IndexExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 IndexExpression = D1 ('MetaData "IndexExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "IndexExpression" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "operand") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "index") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression))))

data IncStatement a Source #

Constructors

IncStatement 

Fields

Instances

Instances details
Functor IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> IncStatement a -> IncStatement b #

(<$) :: a -> IncStatement b -> IncStatement a #

Foldable IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => IncStatement m -> m #

foldMap :: Monoid m => (a -> m) -> IncStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> IncStatement a -> m #

foldr :: (a -> b -> b) -> b -> IncStatement a -> b #

foldr' :: (a -> b -> b) -> b -> IncStatement a -> b #

foldl :: (b -> a -> b) -> b -> IncStatement a -> b #

foldl' :: (b -> a -> b) -> b -> IncStatement a -> b #

foldr1 :: (a -> a -> a) -> IncStatement a -> a #

foldl1 :: (a -> a -> a) -> IncStatement a -> a #

toList :: IncStatement a -> [a] #

null :: IncStatement a -> Bool #

length :: IncStatement a -> Int #

elem :: Eq a => a -> IncStatement a -> Bool #

maximum :: Ord a => IncStatement a -> a #

minimum :: Ord a => IncStatement a -> a #

sum :: Num a => IncStatement a -> a #

product :: Num a => IncStatement a -> a #

Traversable IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> IncStatement a -> f (IncStatement b) #

sequenceA :: Applicative f => IncStatement (f a) -> f (IncStatement a) #

mapM :: Monad m => (a -> m b) -> IncStatement a -> m (IncStatement b) #

sequence :: Monad m => IncStatement (m a) -> m (IncStatement a) #

SymbolMatching IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (IncStatement a)

Eq a => Eq (IncStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (IncStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (IncStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (IncStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (IncStatement a) :: Type -> Type #

Methods

from :: IncStatement a -> Rep (IncStatement a) x #

to :: Rep (IncStatement a) x -> IncStatement a #

Generic1 IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 IncStatement :: k -> Type #

Methods

from1 :: forall (a :: k). IncStatement a -> Rep1 IncStatement a #

to1 :: forall (a :: k). Rep1 IncStatement a -> IncStatement a #

type Rep (IncStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (IncStatement a) = D1 ('MetaData "IncStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "IncStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 IncStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 IncStatement = D1 ('MetaData "IncStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "IncStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data ImportSpecList a Source #

Constructors

ImportSpecList 

Fields

Instances

Instances details
Functor ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ImportSpecList a -> ImportSpecList b #

(<$) :: a -> ImportSpecList b -> ImportSpecList a #

Foldable ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ImportSpecList m -> m #

foldMap :: Monoid m => (a -> m) -> ImportSpecList a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportSpecList a -> m #

foldr :: (a -> b -> b) -> b -> ImportSpecList a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpecList a -> b #

foldl :: (b -> a -> b) -> b -> ImportSpecList a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpecList a -> b #

foldr1 :: (a -> a -> a) -> ImportSpecList a -> a #

foldl1 :: (a -> a -> a) -> ImportSpecList a -> a #

toList :: ImportSpecList a -> [a] #

null :: ImportSpecList a -> Bool #

length :: ImportSpecList a -> Int #

elem :: Eq a => a -> ImportSpecList a -> Bool #

maximum :: Ord a => ImportSpecList a -> a #

minimum :: Ord a => ImportSpecList a -> a #

sum :: Num a => ImportSpecList a -> a #

product :: Num a => ImportSpecList a -> a #

Traversable ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpecList a -> f (ImportSpecList b) #

sequenceA :: Applicative f => ImportSpecList (f a) -> f (ImportSpecList a) #

mapM :: Monad m => (a -> m b) -> ImportSpecList a -> m (ImportSpecList b) #

sequence :: Monad m => ImportSpecList (m a) -> m (ImportSpecList a) #

SymbolMatching ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ImportSpecList a)

Eq a => Eq (ImportSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ImportSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ImportSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ImportSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ImportSpecList a) :: Type -> Type #

Generic1 ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ImportSpecList :: k -> Type #

Methods

from1 :: forall (a :: k). ImportSpecList a -> Rep1 ImportSpecList a #

to1 :: forall (a :: k). Rep1 ImportSpecList a -> ImportSpecList a #

type Rep (ImportSpecList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ImportSpecList a) = D1 ('MetaData "ImportSpecList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ImportSpecList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ImportSpec a])))
type Rep1 ImportSpecList Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ImportSpecList = D1 ('MetaData "ImportSpecList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ImportSpecList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ImportSpec)))

data ImportSpec a Source #

Instances

Instances details
Functor ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ImportSpec a -> ImportSpec b #

(<$) :: a -> ImportSpec b -> ImportSpec a #

Foldable ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ImportSpec m -> m #

foldMap :: Monoid m => (a -> m) -> ImportSpec a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportSpec a -> m #

foldr :: (a -> b -> b) -> b -> ImportSpec a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpec a -> b #

foldl :: (b -> a -> b) -> b -> ImportSpec a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpec a -> b #

foldr1 :: (a -> a -> a) -> ImportSpec a -> a #

foldl1 :: (a -> a -> a) -> ImportSpec a -> a #

toList :: ImportSpec a -> [a] #

null :: ImportSpec a -> Bool #

length :: ImportSpec a -> Int #

elem :: Eq a => a -> ImportSpec a -> Bool #

maximum :: Ord a => ImportSpec a -> a #

minimum :: Ord a => ImportSpec a -> a #

sum :: Num a => ImportSpec a -> a #

product :: Num a => ImportSpec a -> a #

Traversable ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpec a -> f (ImportSpec b) #

sequenceA :: Applicative f => ImportSpec (f a) -> f (ImportSpec a) #

mapM :: Monad m => (a -> m b) -> ImportSpec a -> m (ImportSpec b) #

sequence :: Monad m => ImportSpec (m a) -> m (ImportSpec a) #

SymbolMatching ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ImportSpec a)

Eq a => Eq (ImportSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: ImportSpec a -> ImportSpec a -> Bool #

(/=) :: ImportSpec a -> ImportSpec a -> Bool #

Ord a => Ord (ImportSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ImportSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ImportSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ImportSpec a) :: Type -> Type #

Methods

from :: ImportSpec a -> Rep (ImportSpec a) x #

to :: Rep (ImportSpec a) x -> ImportSpec a #

Generic1 ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ImportSpec :: k -> Type #

Methods

from1 :: forall (a :: k). ImportSpec a -> Rep1 ImportSpec a #

to1 :: forall (a :: k). Rep1 ImportSpec a -> ImportSpec a #

type Rep (ImportSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ImportSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

data ImportDeclaration a Source #

Instances

Instances details
Functor ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ImportDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ImportDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ImportDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ImportDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ImportDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ImportDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ImportDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ImportDeclaration a -> a #

toList :: ImportDeclaration a -> [a] #

null :: ImportDeclaration a -> Bool #

length :: ImportDeclaration a -> Int #

elem :: Eq a => a -> ImportDeclaration a -> Bool #

maximum :: Ord a => ImportDeclaration a -> a #

minimum :: Ord a => ImportDeclaration a -> a #

sum :: Num a => ImportDeclaration a -> a #

product :: Num a => ImportDeclaration a -> a #

Traversable ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ImportDeclaration a -> f (ImportDeclaration b) #

sequenceA :: Applicative f => ImportDeclaration (f a) -> f (ImportDeclaration a) #

mapM :: Monad m => (a -> m b) -> ImportDeclaration a -> m (ImportDeclaration b) #

sequence :: Monad m => ImportDeclaration (m a) -> m (ImportDeclaration a) #

SymbolMatching ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ImportDeclaration a)

Eq a => Eq (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ImportDeclaration a) :: Type -> Type #

Generic1 ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ImportDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). ImportDeclaration a -> Rep1 ImportDeclaration a #

to1 :: forall (a :: k). Rep1 ImportDeclaration a -> ImportDeclaration a #

type Rep (ImportDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ImportDeclaration a) = D1 ('MetaData "ImportDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ImportDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((ImportSpec :+: ImportSpecList) a))))
type Rep1 ImportDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ImportDeclaration = D1 ('MetaData "ImportDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ImportDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (ImportSpec :+: ImportSpecList))))

data ImplicitLengthArrayType a Source #

Constructors

ImplicitLengthArrayType 

Fields

Instances

Instances details
Functor ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ImplicitLengthArrayType m -> m #

foldMap :: Monoid m => (a -> m) -> ImplicitLengthArrayType a -> m #

foldMap' :: Monoid m => (a -> m) -> ImplicitLengthArrayType a -> m #

foldr :: (a -> b -> b) -> b -> ImplicitLengthArrayType a -> b #

foldr' :: (a -> b -> b) -> b -> ImplicitLengthArrayType a -> b #

foldl :: (b -> a -> b) -> b -> ImplicitLengthArrayType a -> b #

foldl' :: (b -> a -> b) -> b -> ImplicitLengthArrayType a -> b #

foldr1 :: (a -> a -> a) -> ImplicitLengthArrayType a -> a #

foldl1 :: (a -> a -> a) -> ImplicitLengthArrayType a -> a #

toList :: ImplicitLengthArrayType a -> [a] #

null :: ImplicitLengthArrayType a -> Bool #

length :: ImplicitLengthArrayType a -> Int #

elem :: Eq a => a -> ImplicitLengthArrayType a -> Bool #

maximum :: Ord a => ImplicitLengthArrayType a -> a #

minimum :: Ord a => ImplicitLengthArrayType a -> a #

sum :: Num a => ImplicitLengthArrayType a -> a #

product :: Num a => ImplicitLengthArrayType a -> a #

Traversable ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ImplicitLengthArrayType a)

Eq a => Eq (ImplicitLengthArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ImplicitLengthArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ImplicitLengthArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ImplicitLengthArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ImplicitLengthArrayType a) :: Type -> Type #

Generic1 ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ImplicitLengthArrayType :: k -> Type #

type Rep (ImplicitLengthArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ImplicitLengthArrayType a) = D1 ('MetaData "ImplicitLengthArrayType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ImplicitLengthArrayType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "element") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))
type Rep1 ImplicitLengthArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ImplicitLengthArrayType = D1 ('MetaData "ImplicitLengthArrayType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ImplicitLengthArrayType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "element") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type)))

data IfStatement a Source #

Instances

Instances details
Functor IfStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> IfStatement a -> IfStatement b #

(<$) :: a -> IfStatement b -> IfStatement a #

Foldable IfStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal IfStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (IfStatement a)

Eq a => Eq (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (IfStatement a) Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

type Rep (IfStatement a) = D1 ('MetaData "IfStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 ((Block :+: IfStatement) a)))) :*: (S1 ('MetaSel ('Just "initializer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SimpleStatement a))) :*: (S1 ('MetaSel ('Just "consequence") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Block a)) :*: S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))))
type Rep1 IfStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

data GotoStatement a Source #

Constructors

GotoStatement 

Fields

Instances

Instances details
Functor GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> GotoStatement a -> GotoStatement b #

(<$) :: a -> GotoStatement b -> GotoStatement a #

Foldable GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => GotoStatement m -> m #

foldMap :: Monoid m => (a -> m) -> GotoStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> GotoStatement a -> m #

foldr :: (a -> b -> b) -> b -> GotoStatement a -> b #

foldr' :: (a -> b -> b) -> b -> GotoStatement a -> b #

foldl :: (b -> a -> b) -> b -> GotoStatement a -> b #

foldl' :: (b -> a -> b) -> b -> GotoStatement a -> b #

foldr1 :: (a -> a -> a) -> GotoStatement a -> a #

foldl1 :: (a -> a -> a) -> GotoStatement a -> a #

toList :: GotoStatement a -> [a] #

null :: GotoStatement a -> Bool #

length :: GotoStatement a -> Int #

elem :: Eq a => a -> GotoStatement a -> Bool #

maximum :: Ord a => GotoStatement a -> a #

minimum :: Ord a => GotoStatement a -> a #

sum :: Num a => GotoStatement a -> a #

product :: Num a => GotoStatement a -> a #

Traversable GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> GotoStatement a -> f (GotoStatement b) #

sequenceA :: Applicative f => GotoStatement (f a) -> f (GotoStatement a) #

mapM :: Monad m => (a -> m b) -> GotoStatement a -> m (GotoStatement b) #

sequence :: Monad m => GotoStatement (m a) -> m (GotoStatement a) #

SymbolMatching GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (GotoStatement a)

Eq a => Eq (GotoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (GotoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (GotoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (GotoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (GotoStatement a) :: Type -> Type #

Generic1 GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 GotoStatement :: k -> Type #

Methods

from1 :: forall (a :: k). GotoStatement a -> Rep1 GotoStatement a #

to1 :: forall (a :: k). Rep1 GotoStatement a -> GotoStatement a #

type Rep (GotoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (GotoStatement a) = D1 ('MetaData "GotoStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "GotoStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LabelName a))))
type Rep1 GotoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 GotoStatement = D1 ('MetaData "GotoStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "GotoStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 LabelName)))

data GoStatement a Source #

Constructors

GoStatement 

Fields

Instances

Instances details
Functor GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> GoStatement a -> GoStatement b #

(<$) :: a -> GoStatement b -> GoStatement a #

Foldable GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => GoStatement m -> m #

foldMap :: Monoid m => (a -> m) -> GoStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> GoStatement a -> m #

foldr :: (a -> b -> b) -> b -> GoStatement a -> b #

foldr' :: (a -> b -> b) -> b -> GoStatement a -> b #

foldl :: (b -> a -> b) -> b -> GoStatement a -> b #

foldl' :: (b -> a -> b) -> b -> GoStatement a -> b #

foldr1 :: (a -> a -> a) -> GoStatement a -> a #

foldl1 :: (a -> a -> a) -> GoStatement a -> a #

toList :: GoStatement a -> [a] #

null :: GoStatement a -> Bool #

length :: GoStatement a -> Int #

elem :: Eq a => a -> GoStatement a -> Bool #

maximum :: Ord a => GoStatement a -> a #

minimum :: Ord a => GoStatement a -> a #

sum :: Num a => GoStatement a -> a #

product :: Num a => GoStatement a -> a #

Traversable GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> GoStatement a -> f (GoStatement b) #

sequenceA :: Applicative f => GoStatement (f a) -> f (GoStatement a) #

mapM :: Monad m => (a -> m b) -> GoStatement a -> m (GoStatement b) #

sequence :: Monad m => GoStatement (m a) -> m (GoStatement a) #

SymbolMatching GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (GoStatement a)

Eq a => Eq (GoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (GoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (GoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (GoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (GoStatement a) :: Type -> Type #

Methods

from :: GoStatement a -> Rep (GoStatement a) x #

to :: Rep (GoStatement a) x -> GoStatement a #

Generic1 GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 GoStatement :: k -> Type #

Methods

from1 :: forall (a :: k). GoStatement a -> Rep1 GoStatement a #

to1 :: forall (a :: k). Rep1 GoStatement a -> GoStatement a #

type Rep (GoStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (GoStatement a) = D1 ('MetaData "GoStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "GoStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 GoStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 GoStatement = D1 ('MetaData "GoStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "GoStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data FunctionType a Source #

Constructors

FunctionType 

Instances

Instances details
Functor FunctionType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> FunctionType a -> FunctionType b #

(<$) :: a -> FunctionType b -> FunctionType a #

Foldable FunctionType Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal FunctionType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (FunctionType a)

Eq a => Eq (FunctionType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (FunctionType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (FunctionType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (FunctionType a) Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

type Rep (FunctionType a) = D1 ('MetaData "FunctionType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FunctionType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "result") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ((SimpleType :+: ParameterList) a))) :*: S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ParameterList a)))))
type Rep1 FunctionType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 FunctionType = D1 ('MetaData "FunctionType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FunctionType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "result") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 (SimpleType :+: ParameterList)) :*: S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ParameterList))))

data FunctionDeclaration a Source #

Constructors

FunctionDeclaration 

Instances

Instances details
Functor FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

SymbolMatching FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (FunctionDeclaration a)

Eq a => Eq (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (FunctionDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (FunctionDeclaration a) :: Type -> Type #

Generic1 FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep1 FunctionDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

data FuncLiteral a Source #

Constructors

FuncLiteral 

Instances

Instances details
Functor FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> FuncLiteral a -> FuncLiteral b #

(<$) :: a -> FuncLiteral b -> FuncLiteral a #

Foldable FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => FuncLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> FuncLiteral a -> m #

foldMap' :: Monoid m => (a -> m) -> FuncLiteral a -> m #

foldr :: (a -> b -> b) -> b -> FuncLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> FuncLiteral a -> b #

foldl :: (b -> a -> b) -> b -> FuncLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> FuncLiteral a -> b #

foldr1 :: (a -> a -> a) -> FuncLiteral a -> a #

foldl1 :: (a -> a -> a) -> FuncLiteral a -> a #

toList :: FuncLiteral a -> [a] #

null :: FuncLiteral a -> Bool #

length :: FuncLiteral a -> Int #

elem :: Eq a => a -> FuncLiteral a -> Bool #

maximum :: Ord a => FuncLiteral a -> a #

minimum :: Ord a => FuncLiteral a -> a #

sum :: Num a => FuncLiteral a -> a #

product :: Num a => FuncLiteral a -> a #

Traversable FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> FuncLiteral a -> f (FuncLiteral b) #

sequenceA :: Applicative f => FuncLiteral (f a) -> f (FuncLiteral a) #

mapM :: Monad m => (a -> m b) -> FuncLiteral a -> m (FuncLiteral b) #

sequence :: Monad m => FuncLiteral (m a) -> m (FuncLiteral a) #

SymbolMatching FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (FuncLiteral a)

Eq a => Eq (FuncLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (FuncLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (FuncLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (FuncLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (FuncLiteral a) :: Type -> Type #

Methods

from :: FuncLiteral a -> Rep (FuncLiteral a) x #

to :: Rep (FuncLiteral a) x -> FuncLiteral a #

Generic1 FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 FuncLiteral :: k -> Type #

Methods

from1 :: forall (a :: k). FuncLiteral a -> Rep1 FuncLiteral a #

to1 :: forall (a :: k). Rep1 FuncLiteral a -> FuncLiteral a #

type Rep (FuncLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (FuncLiteral a) = D1 ('MetaData "FuncLiteral" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FuncLiteral" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Block a))) :*: (S1 ('MetaSel ('Just "result") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ((SimpleType :+: ParameterList) a))) :*: S1 ('MetaSel ('Just "parameters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ParameterList a)))))
type Rep1 FuncLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

data ForStatement a Source #

Constructors

ForStatement 

Instances

Instances details
Functor ForStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ForStatement a -> ForStatement b #

(<$) :: a -> ForStatement b -> ForStatement a #

Foldable ForStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal ForStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ForStatement a)

Eq a => Eq (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ForStatement a) Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

type Rep (ForStatement a) = D1 ('MetaData "ForStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ForStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Block a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ((Expression :+: (ForClause :+: RangeClause)) a))))))
type Rep1 ForStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ForStatement = D1 ('MetaData "ForStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ForStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "body") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Block) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 (Expression :+: (ForClause :+: RangeClause))))))

data ForClause a Source #

Constructors

ForClause 

Instances

Instances details
Functor ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ForClause a -> ForClause b #

(<$) :: a -> ForClause b -> ForClause a #

Foldable ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ForClause m -> m #

foldMap :: Monoid m => (a -> m) -> ForClause a -> m #

foldMap' :: Monoid m => (a -> m) -> ForClause a -> m #

foldr :: (a -> b -> b) -> b -> ForClause a -> b #

foldr' :: (a -> b -> b) -> b -> ForClause a -> b #

foldl :: (b -> a -> b) -> b -> ForClause a -> b #

foldl' :: (b -> a -> b) -> b -> ForClause a -> b #

foldr1 :: (a -> a -> a) -> ForClause a -> a #

foldl1 :: (a -> a -> a) -> ForClause a -> a #

toList :: ForClause a -> [a] #

null :: ForClause a -> Bool #

length :: ForClause a -> Int #

elem :: Eq a => a -> ForClause a -> Bool #

maximum :: Ord a => ForClause a -> a #

minimum :: Ord a => ForClause a -> a #

sum :: Num a => ForClause a -> a #

product :: Num a => ForClause a -> a #

Traversable ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ForClause a -> f (ForClause b) #

sequenceA :: Applicative f => ForClause (f a) -> f (ForClause a) #

mapM :: Monad m => (a -> m b) -> ForClause a -> m (ForClause b) #

sequence :: Monad m => ForClause (m a) -> m (ForClause a) #

SymbolMatching ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy ForClause -> Node -> Bool

showFailure :: Proxy ForClause -> Node -> String

Unmarshal ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ForClause a)

Eq a => Eq (ForClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: ForClause a -> ForClause a -> Bool #

(/=) :: ForClause a -> ForClause a -> Bool #

Ord a => Ord (ForClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ForClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ForClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ForClause a) :: Type -> Type #

Methods

from :: ForClause a -> Rep (ForClause a) x #

to :: Rep (ForClause a) x -> ForClause a #

Generic1 ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ForClause :: k -> Type #

Methods

from1 :: forall (a :: k). ForClause a -> Rep1 ForClause a #

to1 :: forall (a :: k). Rep1 ForClause a -> ForClause a #

type Rep (ForClause a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ForClause a) = D1 ('MetaData "ForClause" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ForClause" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "initializer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SimpleStatement a)))) :*: (S1 ('MetaSel ('Just "condition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Expression a))) :*: S1 ('MetaSel ('Just "update") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SimpleStatement a))))))
type Rep1 ForClause Source # 
Instance details

Defined in TreeSitter.Go.AST

data FieldDeclarationList a Source #

Constructors

FieldDeclarationList 

Fields

Instances

Instances details
Functor FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => FieldDeclarationList m -> m #

foldMap :: Monoid m => (a -> m) -> FieldDeclarationList a -> m #

foldMap' :: Monoid m => (a -> m) -> FieldDeclarationList a -> m #

foldr :: (a -> b -> b) -> b -> FieldDeclarationList a -> b #

foldr' :: (a -> b -> b) -> b -> FieldDeclarationList a -> b #

foldl :: (b -> a -> b) -> b -> FieldDeclarationList a -> b #

foldl' :: (b -> a -> b) -> b -> FieldDeclarationList a -> b #

foldr1 :: (a -> a -> a) -> FieldDeclarationList a -> a #

foldl1 :: (a -> a -> a) -> FieldDeclarationList a -> a #

toList :: FieldDeclarationList a -> [a] #

null :: FieldDeclarationList a -> Bool #

length :: FieldDeclarationList a -> Int #

elem :: Eq a => a -> FieldDeclarationList a -> Bool #

maximum :: Ord a => FieldDeclarationList a -> a #

minimum :: Ord a => FieldDeclarationList a -> a #

sum :: Num a => FieldDeclarationList a -> a #

product :: Num a => FieldDeclarationList a -> a #

Traversable FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (FieldDeclarationList a)

Eq a => Eq (FieldDeclarationList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (FieldDeclarationList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (FieldDeclarationList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (FieldDeclarationList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (FieldDeclarationList a) :: Type -> Type #

Generic1 FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 FieldDeclarationList :: k -> Type #

Methods

from1 :: forall (a :: k). FieldDeclarationList a -> Rep1 FieldDeclarationList a #

to1 :: forall (a :: k). Rep1 FieldDeclarationList a -> FieldDeclarationList a #

type Rep (FieldDeclarationList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (FieldDeclarationList a) = D1 ('MetaData "FieldDeclarationList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FieldDeclarationList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FieldDeclaration a])))
type Rep1 FieldDeclarationList Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 FieldDeclarationList = D1 ('MetaData "FieldDeclarationList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FieldDeclarationList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 FieldDeclaration)))

data FieldDeclaration a Source #

Instances

Instances details
Functor FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> FieldDeclaration a -> FieldDeclaration b #

(<$) :: a -> FieldDeclaration b -> FieldDeclaration a #

Foldable FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => FieldDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> FieldDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> FieldDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> FieldDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> FieldDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> FieldDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> FieldDeclaration a -> b #

foldr1 :: (a -> a -> a) -> FieldDeclaration a -> a #

foldl1 :: (a -> a -> a) -> FieldDeclaration a -> a #

toList :: FieldDeclaration a -> [a] #

null :: FieldDeclaration a -> Bool #

length :: FieldDeclaration a -> Int #

elem :: Eq a => a -> FieldDeclaration a -> Bool #

maximum :: Ord a => FieldDeclaration a -> a #

minimum :: Ord a => FieldDeclaration a -> a #

sum :: Num a => FieldDeclaration a -> a #

product :: Num a => FieldDeclaration a -> a #

Traversable FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> FieldDeclaration a -> f (FieldDeclaration b) #

sequenceA :: Applicative f => FieldDeclaration (f a) -> f (FieldDeclaration a) #

mapM :: Monad m => (a -> m b) -> FieldDeclaration a -> m (FieldDeclaration b) #

sequence :: Monad m => FieldDeclaration (m a) -> m (FieldDeclaration a) #

SymbolMatching FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (FieldDeclaration a)

Eq a => Eq (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (FieldDeclaration a) :: Type -> Type #

Generic1 FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 FieldDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). FieldDeclaration a -> Rep1 FieldDeclaration a #

to1 :: forall (a :: k). Rep1 FieldDeclaration a -> FieldDeclaration a #

type Rep (FieldDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 FieldDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

data FallthroughStatement a Source #

Constructors

FallthroughStatement 

Fields

Instances

Instances details
Functor FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => FallthroughStatement m -> m #

foldMap :: Monoid m => (a -> m) -> FallthroughStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> FallthroughStatement a -> m #

foldr :: (a -> b -> b) -> b -> FallthroughStatement a -> b #

foldr' :: (a -> b -> b) -> b -> FallthroughStatement a -> b #

foldl :: (b -> a -> b) -> b -> FallthroughStatement a -> b #

foldl' :: (b -> a -> b) -> b -> FallthroughStatement a -> b #

foldr1 :: (a -> a -> a) -> FallthroughStatement a -> a #

foldl1 :: (a -> a -> a) -> FallthroughStatement a -> a #

toList :: FallthroughStatement a -> [a] #

null :: FallthroughStatement a -> Bool #

length :: FallthroughStatement a -> Int #

elem :: Eq a => a -> FallthroughStatement a -> Bool #

maximum :: Ord a => FallthroughStatement a -> a #

minimum :: Ord a => FallthroughStatement a -> a #

sum :: Num a => FallthroughStatement a -> a #

product :: Num a => FallthroughStatement a -> a #

Traversable FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (FallthroughStatement a)

Eq a => Eq (FallthroughStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (FallthroughStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (FallthroughStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (FallthroughStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (FallthroughStatement a) :: Type -> Type #

Generic1 FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 FallthroughStatement :: k -> Type #

Methods

from1 :: forall (a :: k). FallthroughStatement a -> Rep1 FallthroughStatement a #

to1 :: forall (a :: k). Rep1 FallthroughStatement a -> FallthroughStatement a #

type Rep (FallthroughStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (FallthroughStatement a) = D1 ('MetaData "FallthroughStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FallthroughStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 FallthroughStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 FallthroughStatement = D1 ('MetaData "FallthroughStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "FallthroughStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data ExpressionSwitchStatement a Source #

Instances

Instances details
Functor ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ExpressionSwitchStatement m -> m #

foldMap :: Monoid m => (a -> m) -> ExpressionSwitchStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> ExpressionSwitchStatement a -> m #

foldr :: (a -> b -> b) -> b -> ExpressionSwitchStatement a -> b #

foldr' :: (a -> b -> b) -> b -> ExpressionSwitchStatement a -> b #

foldl :: (b -> a -> b) -> b -> ExpressionSwitchStatement a -> b #

foldl' :: (b -> a -> b) -> b -> ExpressionSwitchStatement a -> b #

foldr1 :: (a -> a -> a) -> ExpressionSwitchStatement a -> a #

foldl1 :: (a -> a -> a) -> ExpressionSwitchStatement a -> a #

toList :: ExpressionSwitchStatement a -> [a] #

null :: ExpressionSwitchStatement a -> Bool #

length :: ExpressionSwitchStatement a -> Int #

elem :: Eq a => a -> ExpressionSwitchStatement a -> Bool #

maximum :: Ord a => ExpressionSwitchStatement a -> a #

minimum :: Ord a => ExpressionSwitchStatement a -> a #

sum :: Num a => ExpressionSwitchStatement a -> a #

product :: Num a => ExpressionSwitchStatement a -> a #

Traversable ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ExpressionSwitchStatement a)

Eq a => Eq (ExpressionSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ExpressionSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ExpressionSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ExpressionSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ExpressionSwitchStatement a) :: Type -> Type #

Generic1 ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ExpressionSwitchStatement :: k -> Type #

type Rep (ExpressionSwitchStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ExpressionSwitchStatement a) = D1 ('MetaData "ExpressionSwitchStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionSwitchStatement" '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 "initializer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SimpleStatement a))) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(DefaultCase :+: ExpressionCase) a]))))
type Rep1 ExpressionSwitchStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

data ExpressionList a Source #

Constructors

ExpressionList 

Fields

Instances

Instances details
Functor ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ExpressionList a -> ExpressionList b #

(<$) :: a -> ExpressionList b -> ExpressionList a #

Foldable ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ExpressionList m -> m #

foldMap :: Monoid m => (a -> m) -> ExpressionList a -> m #

foldMap' :: Monoid m => (a -> m) -> ExpressionList a -> m #

foldr :: (a -> b -> b) -> b -> ExpressionList a -> b #

foldr' :: (a -> b -> b) -> b -> ExpressionList a -> b #

foldl :: (b -> a -> b) -> b -> ExpressionList a -> b #

foldl' :: (b -> a -> b) -> b -> ExpressionList a -> b #

foldr1 :: (a -> a -> a) -> ExpressionList a -> a #

foldl1 :: (a -> a -> a) -> ExpressionList a -> a #

toList :: ExpressionList a -> [a] #

null :: ExpressionList a -> Bool #

length :: ExpressionList a -> Int #

elem :: Eq a => a -> ExpressionList a -> Bool #

maximum :: Ord a => ExpressionList a -> a #

minimum :: Ord a => ExpressionList a -> a #

sum :: Num a => ExpressionList a -> a #

product :: Num a => ExpressionList a -> a #

Traversable ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExpressionList a -> f (ExpressionList b) #

sequenceA :: Applicative f => ExpressionList (f a) -> f (ExpressionList a) #

mapM :: Monad m => (a -> m b) -> ExpressionList a -> m (ExpressionList b) #

sequence :: Monad m => ExpressionList (m a) -> m (ExpressionList a) #

SymbolMatching ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ExpressionList a)

Eq a => Eq (ExpressionList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ExpressionList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ExpressionList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ExpressionList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ExpressionList a) :: Type -> Type #

Generic1 ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ExpressionList :: k -> Type #

Methods

from1 :: forall (a :: k). ExpressionList a -> Rep1 ExpressionList a #

to1 :: forall (a :: k). Rep1 ExpressionList a -> ExpressionList a #

type Rep (ExpressionList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ExpressionList a) = D1 ('MetaData "ExpressionList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Expression a)))))
type Rep1 ExpressionList Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ExpressionList = D1 ('MetaData "ExpressionList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (NonEmpty :.: Rec1 Expression)))

data ExpressionCase a Source #

Constructors

ExpressionCase 

Fields

Instances

Instances details
Functor ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ExpressionCase a -> ExpressionCase b #

(<$) :: a -> ExpressionCase b -> ExpressionCase a #

Foldable ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ExpressionCase m -> m #

foldMap :: Monoid m => (a -> m) -> ExpressionCase a -> m #

foldMap' :: Monoid m => (a -> m) -> ExpressionCase a -> m #

foldr :: (a -> b -> b) -> b -> ExpressionCase a -> b #

foldr' :: (a -> b -> b) -> b -> ExpressionCase a -> b #

foldl :: (b -> a -> b) -> b -> ExpressionCase a -> b #

foldl' :: (b -> a -> b) -> b -> ExpressionCase a -> b #

foldr1 :: (a -> a -> a) -> ExpressionCase a -> a #

foldl1 :: (a -> a -> a) -> ExpressionCase a -> a #

toList :: ExpressionCase a -> [a] #

null :: ExpressionCase a -> Bool #

length :: ExpressionCase a -> Int #

elem :: Eq a => a -> ExpressionCase a -> Bool #

maximum :: Ord a => ExpressionCase a -> a #

minimum :: Ord a => ExpressionCase a -> a #

sum :: Num a => ExpressionCase a -> a #

product :: Num a => ExpressionCase a -> a #

Traversable ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ExpressionCase a -> f (ExpressionCase b) #

sequenceA :: Applicative f => ExpressionCase (f a) -> f (ExpressionCase a) #

mapM :: Monad m => (a -> m b) -> ExpressionCase a -> m (ExpressionCase b) #

sequence :: Monad m => ExpressionCase (m a) -> m (ExpressionCase a) #

SymbolMatching ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ExpressionCase a)

Eq a => Eq (ExpressionCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ExpressionCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ExpressionCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ExpressionCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ExpressionCase a) :: Type -> Type #

Generic1 ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ExpressionCase :: k -> Type #

Methods

from1 :: forall (a :: k). ExpressionCase a -> Rep1 ExpressionCase a #

to1 :: forall (a :: k). Rep1 ExpressionCase a -> ExpressionCase a #

type Rep (ExpressionCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ExpressionCase a) = D1 ('MetaData "ExpressionCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ExpressionList a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Statement a]))))
type Rep1 ExpressionCase Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ExpressionCase = D1 ('MetaData "ExpressionCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ExpressionCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ExpressionList) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement))))

data EmptyStatement a Source #

Constructors

EmptyStatement 

Fields

Instances

Instances details
Functor EmptyStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> EmptyStatement a -> EmptyStatement b #

(<$) :: a -> EmptyStatement b -> EmptyStatement a #

Foldable EmptyStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal EmptyStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (EmptyStatement a)

Eq a => Eq (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (EmptyStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (EmptyStatement a) :: Type -> Type #

Generic1 EmptyStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (EmptyStatement a) = D1 ('MetaData "EmptyStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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.Go.AST

type Rep1 EmptyStatement = D1 ('MetaData "EmptyStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 Element a Source #

Constructors

Element 

Instances

Instances details
Functor Element Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> Element a -> Element b #

(<$) :: a -> Element b -> Element a #

Foldable Element Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => Element m -> m #

foldMap :: Monoid m => (a -> m) -> Element a -> m #

foldMap' :: Monoid m => (a -> m) -> Element a -> m #

foldr :: (a -> b -> b) -> b -> Element a -> b #

foldr' :: (a -> b -> b) -> b -> Element a -> b #

foldl :: (b -> a -> b) -> b -> Element a -> b #

foldl' :: (b -> a -> b) -> b -> Element a -> b #

foldr1 :: (a -> a -> a) -> Element a -> a #

foldl1 :: (a -> a -> a) -> Element a -> a #

toList :: Element a -> [a] #

null :: Element a -> Bool #

length :: Element a -> Int #

elem :: Eq a => a -> Element a -> Bool #

maximum :: Ord a => Element a -> a #

minimum :: Ord a => Element a -> a #

sum :: Num a => Element a -> a #

product :: Num a => Element a -> a #

Traversable Element Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> Element a -> f (Element b) #

sequenceA :: Applicative f => Element (f a) -> f (Element a) #

mapM :: Monad m => (a -> m b) -> Element a -> m (Element b) #

sequence :: Monad m => Element (m a) -> m (Element a) #

SymbolMatching Element Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy Element -> Node -> Bool

showFailure :: Proxy Element -> Node -> String

Unmarshal Element Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Element a)

Eq a => Eq (Element a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: Element a -> Element a -> Bool #

(/=) :: Element a -> Element a -> Bool #

Ord a => Ord (Element a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

compare :: Element a -> Element a -> Ordering #

(<) :: Element a -> Element a -> Bool #

(<=) :: Element a -> Element a -> Bool #

(>) :: Element a -> Element a -> Bool #

(>=) :: Element a -> Element a -> Bool #

max :: Element a -> Element a -> Element a #

min :: Element a -> Element a -> Element a #

Show a => Show (Element a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

showsPrec :: Int -> Element a -> ShowS #

show :: Element a -> String #

showList :: [Element a] -> ShowS #

Generic (Element a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (Element a) :: Type -> Type #

Methods

from :: Element a -> Rep (Element a) x #

to :: Rep (Element a) x -> Element a #

Generic1 Element Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 Element :: k -> Type #

Methods

from1 :: forall (a :: k). Element a -> Rep1 Element a #

to1 :: forall (a :: k). Rep1 Element a -> Element a #

type Rep (Element a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (Element a) = D1 ('MetaData "Element" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "Element" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((Expression :+: LiteralValue) a))))
type Rep1 Element Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 Element = D1 ('MetaData "Element" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "Element" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (Expression :+: LiteralValue))))

data Dot a Source #

Constructors

Dot 

Fields

Instances

Instances details
Functor Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> Dot a -> Dot b #

(<$) :: a -> Dot b -> Dot a #

Foldable Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => Dot m -> m #

foldMap :: Monoid m => (a -> m) -> Dot a -> m #

foldMap' :: Monoid m => (a -> m) -> Dot a -> m #

foldr :: (a -> b -> b) -> b -> Dot a -> b #

foldr' :: (a -> b -> b) -> b -> Dot a -> b #

foldl :: (b -> a -> b) -> b -> Dot a -> b #

foldl' :: (b -> a -> b) -> b -> Dot a -> b #

foldr1 :: (a -> a -> a) -> Dot a -> a #

foldl1 :: (a -> a -> a) -> Dot a -> a #

toList :: Dot a -> [a] #

null :: Dot a -> Bool #

length :: Dot a -> Int #

elem :: Eq a => a -> Dot a -> Bool #

maximum :: Ord a => Dot a -> a #

minimum :: Ord a => Dot a -> a #

sum :: Num a => Dot a -> a #

product :: Num a => Dot a -> a #

Traversable Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> Dot a -> f (Dot b) #

sequenceA :: Applicative f => Dot (f a) -> f (Dot a) #

mapM :: Monad m => (a -> m b) -> Dot a -> m (Dot b) #

sequence :: Monad m => Dot (m a) -> m (Dot a) #

SymbolMatching Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy Dot -> Node -> Bool

showFailure :: Proxy Dot -> Node -> String

Unmarshal Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Dot a)

Eq a => Eq (Dot a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: Dot a -> Dot a -> Bool #

(/=) :: Dot a -> Dot a -> Bool #

Ord a => Ord (Dot a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

compare :: Dot a -> Dot a -> Ordering #

(<) :: Dot a -> Dot a -> Bool #

(<=) :: Dot a -> Dot a -> Bool #

(>) :: Dot a -> Dot a -> Bool #

(>=) :: Dot a -> Dot a -> Bool #

max :: Dot a -> Dot a -> Dot a #

min :: Dot a -> Dot a -> Dot a #

Show a => Show (Dot a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

showsPrec :: Int -> Dot a -> ShowS #

show :: Dot a -> String #

showList :: [Dot a] -> ShowS #

Generic (Dot a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (Dot a) :: Type -> Type #

Methods

from :: Dot a -> Rep (Dot a) x #

to :: Rep (Dot a) x -> Dot a #

Generic1 Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 Dot :: k -> Type #

Methods

from1 :: forall (a :: k). Dot a -> Rep1 Dot a #

to1 :: forall (a :: k). Rep1 Dot a -> Dot a #

type Rep (Dot a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (Dot a) = D1 ('MetaData "Dot" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "Dot" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
type Rep1 Dot Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 Dot = D1 ('MetaData "Dot" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "Dot" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "text") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data DeferStatement a Source #

Constructors

DeferStatement 

Fields

Instances

Instances details
Functor DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> DeferStatement a -> DeferStatement b #

(<$) :: a -> DeferStatement b -> DeferStatement a #

Foldable DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => DeferStatement m -> m #

foldMap :: Monoid m => (a -> m) -> DeferStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> DeferStatement a -> m #

foldr :: (a -> b -> b) -> b -> DeferStatement a -> b #

foldr' :: (a -> b -> b) -> b -> DeferStatement a -> b #

foldl :: (b -> a -> b) -> b -> DeferStatement a -> b #

foldl' :: (b -> a -> b) -> b -> DeferStatement a -> b #

foldr1 :: (a -> a -> a) -> DeferStatement a -> a #

foldl1 :: (a -> a -> a) -> DeferStatement a -> a #

toList :: DeferStatement a -> [a] #

null :: DeferStatement a -> Bool #

length :: DeferStatement a -> Int #

elem :: Eq a => a -> DeferStatement a -> Bool #

maximum :: Ord a => DeferStatement a -> a #

minimum :: Ord a => DeferStatement a -> a #

sum :: Num a => DeferStatement a -> a #

product :: Num a => DeferStatement a -> a #

Traversable DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> DeferStatement a -> f (DeferStatement b) #

sequenceA :: Applicative f => DeferStatement (f a) -> f (DeferStatement a) #

mapM :: Monad m => (a -> m b) -> DeferStatement a -> m (DeferStatement b) #

sequence :: Monad m => DeferStatement (m a) -> m (DeferStatement a) #

SymbolMatching DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (DeferStatement a)

Eq a => Eq (DeferStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (DeferStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (DeferStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (DeferStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (DeferStatement a) :: Type -> Type #

Generic1 DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 DeferStatement :: k -> Type #

Methods

from1 :: forall (a :: k). DeferStatement a -> Rep1 DeferStatement a #

to1 :: forall (a :: k). Rep1 DeferStatement a -> DeferStatement a #

type Rep (DeferStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (DeferStatement a) = D1 ('MetaData "DeferStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "DeferStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 DeferStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 DeferStatement = D1 ('MetaData "DeferStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "DeferStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data DefaultCase a Source #

Constructors

DefaultCase 

Fields

Instances

Instances details
Functor DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> DefaultCase a -> DefaultCase b #

(<$) :: a -> DefaultCase b -> DefaultCase a #

Foldable DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => DefaultCase m -> m #

foldMap :: Monoid m => (a -> m) -> DefaultCase a -> m #

foldMap' :: Monoid m => (a -> m) -> DefaultCase a -> m #

foldr :: (a -> b -> b) -> b -> DefaultCase a -> b #

foldr' :: (a -> b -> b) -> b -> DefaultCase a -> b #

foldl :: (b -> a -> b) -> b -> DefaultCase a -> b #

foldl' :: (b -> a -> b) -> b -> DefaultCase a -> b #

foldr1 :: (a -> a -> a) -> DefaultCase a -> a #

foldl1 :: (a -> a -> a) -> DefaultCase a -> a #

toList :: DefaultCase a -> [a] #

null :: DefaultCase a -> Bool #

length :: DefaultCase a -> Int #

elem :: Eq a => a -> DefaultCase a -> Bool #

maximum :: Ord a => DefaultCase a -> a #

minimum :: Ord a => DefaultCase a -> a #

sum :: Num a => DefaultCase a -> a #

product :: Num a => DefaultCase a -> a #

Traversable DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> DefaultCase a -> f (DefaultCase b) #

sequenceA :: Applicative f => DefaultCase (f a) -> f (DefaultCase a) #

mapM :: Monad m => (a -> m b) -> DefaultCase a -> m (DefaultCase b) #

sequence :: Monad m => DefaultCase (m a) -> m (DefaultCase a) #

SymbolMatching DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (DefaultCase a)

Eq a => Eq (DefaultCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (DefaultCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (DefaultCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (DefaultCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (DefaultCase a) :: Type -> Type #

Methods

from :: DefaultCase a -> Rep (DefaultCase a) x #

to :: Rep (DefaultCase a) x -> DefaultCase a #

Generic1 DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 DefaultCase :: k -> Type #

Methods

from1 :: forall (a :: k). DefaultCase a -> Rep1 DefaultCase a #

to1 :: forall (a :: k). Rep1 DefaultCase a -> DefaultCase a #

type Rep (DefaultCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (DefaultCase a) = D1 ('MetaData "DefaultCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "DefaultCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Statement a])))
type Rep1 DefaultCase Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 DefaultCase = D1 ('MetaData "DefaultCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "DefaultCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement)))

data DecStatement a Source #

Constructors

DecStatement 

Fields

Instances

Instances details
Functor DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> DecStatement a -> DecStatement b #

(<$) :: a -> DecStatement b -> DecStatement a #

Foldable DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => DecStatement m -> m #

foldMap :: Monoid m => (a -> m) -> DecStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> DecStatement a -> m #

foldr :: (a -> b -> b) -> b -> DecStatement a -> b #

foldr' :: (a -> b -> b) -> b -> DecStatement a -> b #

foldl :: (b -> a -> b) -> b -> DecStatement a -> b #

foldl' :: (b -> a -> b) -> b -> DecStatement a -> b #

foldr1 :: (a -> a -> a) -> DecStatement a -> a #

foldl1 :: (a -> a -> a) -> DecStatement a -> a #

toList :: DecStatement a -> [a] #

null :: DecStatement a -> Bool #

length :: DecStatement a -> Int #

elem :: Eq a => a -> DecStatement a -> Bool #

maximum :: Ord a => DecStatement a -> a #

minimum :: Ord a => DecStatement a -> a #

sum :: Num a => DecStatement a -> a #

product :: Num a => DecStatement a -> a #

Traversable DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> DecStatement a -> f (DecStatement b) #

sequenceA :: Applicative f => DecStatement (f a) -> f (DecStatement a) #

mapM :: Monad m => (a -> m b) -> DecStatement a -> m (DecStatement b) #

sequence :: Monad m => DecStatement (m a) -> m (DecStatement a) #

SymbolMatching DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (DecStatement a)

Eq a => Eq (DecStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (DecStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (DecStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (DecStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (DecStatement a) :: Type -> Type #

Methods

from :: DecStatement a -> Rep (DecStatement a) x #

to :: Rep (DecStatement a) x -> DecStatement a #

Generic1 DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 DecStatement :: k -> Type #

Methods

from1 :: forall (a :: k). DecStatement a -> Rep1 DecStatement a #

to1 :: forall (a :: k). Rep1 DecStatement a -> DecStatement a #

type Rep (DecStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (DecStatement a) = D1 ('MetaData "DecStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "DecStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a))))
type Rep1 DecStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 DecStatement = D1 ('MetaData "DecStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "DecStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression)))

data ContinueStatement a Source #

Constructors

ContinueStatement 

Fields

Instances

Instances details
Functor ContinueStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable ContinueStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal ContinueStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ContinueStatement a)

Eq a => Eq (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ContinueStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ContinueStatement a) :: Type -> Type #

Generic1 ContinueStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (ContinueStatement a) = D1 ('MetaData "ContinueStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ContinueStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (LabelName a)))))
type Rep1 ContinueStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ContinueStatement = D1 ('MetaData "ContinueStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ContinueStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 LabelName)))

data ConstSpec a Source #

Constructors

ConstSpec 

Instances

Instances details
Functor ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ConstSpec a -> ConstSpec b #

(<$) :: a -> ConstSpec b -> ConstSpec a #

Foldable ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ConstSpec m -> m #

foldMap :: Monoid m => (a -> m) -> ConstSpec a -> m #

foldMap' :: Monoid m => (a -> m) -> ConstSpec a -> m #

foldr :: (a -> b -> b) -> b -> ConstSpec a -> b #

foldr' :: (a -> b -> b) -> b -> ConstSpec a -> b #

foldl :: (b -> a -> b) -> b -> ConstSpec a -> b #

foldl' :: (b -> a -> b) -> b -> ConstSpec a -> b #

foldr1 :: (a -> a -> a) -> ConstSpec a -> a #

foldl1 :: (a -> a -> a) -> ConstSpec a -> a #

toList :: ConstSpec a -> [a] #

null :: ConstSpec a -> Bool #

length :: ConstSpec a -> Int #

elem :: Eq a => a -> ConstSpec a -> Bool #

maximum :: Ord a => ConstSpec a -> a #

minimum :: Ord a => ConstSpec a -> a #

sum :: Num a => ConstSpec a -> a #

product :: Num a => ConstSpec a -> a #

Traversable ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ConstSpec a -> f (ConstSpec b) #

sequenceA :: Applicative f => ConstSpec (f a) -> f (ConstSpec a) #

mapM :: Monad m => (a -> m b) -> ConstSpec a -> m (ConstSpec b) #

sequence :: Monad m => ConstSpec (m a) -> m (ConstSpec a) #

SymbolMatching ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy ConstSpec -> Node -> Bool

showFailure :: Proxy ConstSpec -> Node -> String

Unmarshal ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ConstSpec a)

Eq a => Eq (ConstSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: ConstSpec a -> ConstSpec a -> Bool #

(/=) :: ConstSpec a -> ConstSpec a -> Bool #

Ord a => Ord (ConstSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ConstSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ConstSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ConstSpec a) :: Type -> Type #

Methods

from :: ConstSpec a -> Rep (ConstSpec a) x #

to :: Rep (ConstSpec a) x -> ConstSpec a #

Generic1 ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ConstSpec :: k -> Type #

Methods

from1 :: forall (a :: k). ConstSpec a -> Rep1 ConstSpec a #

to1 :: forall (a :: k). Rep1 ConstSpec a -> ConstSpec a #

type Rep (ConstSpec a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ConstSpec Source # 
Instance details

Defined in TreeSitter.Go.AST

data ConstDeclaration a Source #

Constructors

ConstDeclaration 

Fields

Instances

Instances details
Functor ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ConstDeclaration a -> ConstDeclaration b #

(<$) :: a -> ConstDeclaration b -> ConstDeclaration a #

Foldable ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ConstDeclaration m -> m #

foldMap :: Monoid m => (a -> m) -> ConstDeclaration a -> m #

foldMap' :: Monoid m => (a -> m) -> ConstDeclaration a -> m #

foldr :: (a -> b -> b) -> b -> ConstDeclaration a -> b #

foldr' :: (a -> b -> b) -> b -> ConstDeclaration a -> b #

foldl :: (b -> a -> b) -> b -> ConstDeclaration a -> b #

foldl' :: (b -> a -> b) -> b -> ConstDeclaration a -> b #

foldr1 :: (a -> a -> a) -> ConstDeclaration a -> a #

foldl1 :: (a -> a -> a) -> ConstDeclaration a -> a #

toList :: ConstDeclaration a -> [a] #

null :: ConstDeclaration a -> Bool #

length :: ConstDeclaration a -> Int #

elem :: Eq a => a -> ConstDeclaration a -> Bool #

maximum :: Ord a => ConstDeclaration a -> a #

minimum :: Ord a => ConstDeclaration a -> a #

sum :: Num a => ConstDeclaration a -> a #

product :: Num a => ConstDeclaration a -> a #

Traversable ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ConstDeclaration a -> f (ConstDeclaration b) #

sequenceA :: Applicative f => ConstDeclaration (f a) -> f (ConstDeclaration a) #

mapM :: Monad m => (a -> m b) -> ConstDeclaration a -> m (ConstDeclaration b) #

sequence :: Monad m => ConstDeclaration (m a) -> m (ConstDeclaration a) #

SymbolMatching ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ConstDeclaration a)

Eq a => Eq (ConstDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ConstDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ConstDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ConstDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ConstDeclaration a) :: Type -> Type #

Generic1 ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ConstDeclaration :: k -> Type #

Methods

from1 :: forall (a :: k). ConstDeclaration a -> Rep1 ConstDeclaration a #

to1 :: forall (a :: k). Rep1 ConstDeclaration a -> ConstDeclaration a #

type Rep (ConstDeclaration a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ConstDeclaration a) = D1 ('MetaData "ConstDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ConstDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ConstSpec a])))
type Rep1 ConstDeclaration Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ConstDeclaration = D1 ('MetaData "ConstDeclaration" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ConstDeclaration" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 ConstSpec)))

data CompositeLiteral a Source #

Instances

Instances details
Functor CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> CompositeLiteral a -> CompositeLiteral b #

(<$) :: a -> CompositeLiteral b -> CompositeLiteral a #

Foldable CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => CompositeLiteral m -> m #

foldMap :: Monoid m => (a -> m) -> CompositeLiteral a -> m #

foldMap' :: Monoid m => (a -> m) -> CompositeLiteral a -> m #

foldr :: (a -> b -> b) -> b -> CompositeLiteral a -> b #

foldr' :: (a -> b -> b) -> b -> CompositeLiteral a -> b #

foldl :: (b -> a -> b) -> b -> CompositeLiteral a -> b #

foldl' :: (b -> a -> b) -> b -> CompositeLiteral a -> b #

foldr1 :: (a -> a -> a) -> CompositeLiteral a -> a #

foldl1 :: (a -> a -> a) -> CompositeLiteral a -> a #

toList :: CompositeLiteral a -> [a] #

null :: CompositeLiteral a -> Bool #

length :: CompositeLiteral a -> Int #

elem :: Eq a => a -> CompositeLiteral a -> Bool #

maximum :: Ord a => CompositeLiteral a -> a #

minimum :: Ord a => CompositeLiteral a -> a #

sum :: Num a => CompositeLiteral a -> a #

product :: Num a => CompositeLiteral a -> a #

Traversable CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> CompositeLiteral a -> f (CompositeLiteral b) #

sequenceA :: Applicative f => CompositeLiteral (f a) -> f (CompositeLiteral a) #

mapM :: Monad m => (a -> m b) -> CompositeLiteral a -> m (CompositeLiteral b) #

sequence :: Monad m => CompositeLiteral (m a) -> m (CompositeLiteral a) #

SymbolMatching CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (CompositeLiteral a)

Eq a => Eq (CompositeLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (CompositeLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (CompositeLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (CompositeLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (CompositeLiteral a) :: Type -> Type #

Generic1 CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 CompositeLiteral :: k -> Type #

Methods

from1 :: forall (a :: k). CompositeLiteral a -> Rep1 CompositeLiteral a #

to1 :: forall (a :: k). Rep1 CompositeLiteral a -> CompositeLiteral a #

type Rep (CompositeLiteral a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 CompositeLiteral Source # 
Instance details

Defined in TreeSitter.Go.AST

data CommunicationCase a Source #

Instances

Instances details
Functor CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => CommunicationCase m -> m #

foldMap :: Monoid m => (a -> m) -> CommunicationCase a -> m #

foldMap' :: Monoid m => (a -> m) -> CommunicationCase a -> m #

foldr :: (a -> b -> b) -> b -> CommunicationCase a -> b #

foldr' :: (a -> b -> b) -> b -> CommunicationCase a -> b #

foldl :: (b -> a -> b) -> b -> CommunicationCase a -> b #

foldl' :: (b -> a -> b) -> b -> CommunicationCase a -> b #

foldr1 :: (a -> a -> a) -> CommunicationCase a -> a #

foldl1 :: (a -> a -> a) -> CommunicationCase a -> a #

toList :: CommunicationCase a -> [a] #

null :: CommunicationCase a -> Bool #

length :: CommunicationCase a -> Int #

elem :: Eq a => a -> CommunicationCase a -> Bool #

maximum :: Ord a => CommunicationCase a -> a #

minimum :: Ord a => CommunicationCase a -> a #

sum :: Num a => CommunicationCase a -> a #

product :: Num a => CommunicationCase a -> a #

Traversable CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> CommunicationCase a -> f (CommunicationCase b) #

sequenceA :: Applicative f => CommunicationCase (f a) -> f (CommunicationCase a) #

mapM :: Monad m => (a -> m b) -> CommunicationCase a -> m (CommunicationCase b) #

sequence :: Monad m => CommunicationCase (m a) -> m (CommunicationCase a) #

SymbolMatching CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (CommunicationCase a)

Eq a => Eq (CommunicationCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (CommunicationCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (CommunicationCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (CommunicationCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (CommunicationCase a) :: Type -> Type #

Generic1 CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 CommunicationCase :: k -> Type #

Methods

from1 :: forall (a :: k). CommunicationCase a -> Rep1 CommunicationCase a #

to1 :: forall (a :: k). Rep1 CommunicationCase a -> CommunicationCase a #

type Rep (CommunicationCase a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (CommunicationCase a) = D1 ('MetaData "CommunicationCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "CommunicationCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "communication") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((ReceiveStatement :+: SendStatement) a)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Statement a]))))
type Rep1 CommunicationCase Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 CommunicationCase = D1 ('MetaData "CommunicationCase" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "CommunicationCase" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "communication") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (ReceiveStatement :+: SendStatement)) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement))))

data ChannelType a Source #

Constructors

ChannelType 

Fields

Instances

Instances details
Functor ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ChannelType a -> ChannelType b #

(<$) :: a -> ChannelType b -> ChannelType a #

Foldable ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ChannelType m -> m #

foldMap :: Monoid m => (a -> m) -> ChannelType a -> m #

foldMap' :: Monoid m => (a -> m) -> ChannelType a -> m #

foldr :: (a -> b -> b) -> b -> ChannelType a -> b #

foldr' :: (a -> b -> b) -> b -> ChannelType a -> b #

foldl :: (b -> a -> b) -> b -> ChannelType a -> b #

foldl' :: (b -> a -> b) -> b -> ChannelType a -> b #

foldr1 :: (a -> a -> a) -> ChannelType a -> a #

foldl1 :: (a -> a -> a) -> ChannelType a -> a #

toList :: ChannelType a -> [a] #

null :: ChannelType a -> Bool #

length :: ChannelType a -> Int #

elem :: Eq a => a -> ChannelType a -> Bool #

maximum :: Ord a => ChannelType a -> a #

minimum :: Ord a => ChannelType a -> a #

sum :: Num a => ChannelType a -> a #

product :: Num a => ChannelType a -> a #

Traversable ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ChannelType a -> f (ChannelType b) #

sequenceA :: Applicative f => ChannelType (f a) -> f (ChannelType a) #

mapM :: Monad m => (a -> m b) -> ChannelType a -> m (ChannelType b) #

sequence :: Monad m => ChannelType (m a) -> m (ChannelType a) #

SymbolMatching ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ChannelType a)

Eq a => Eq (ChannelType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ChannelType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ChannelType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ChannelType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ChannelType a) :: Type -> Type #

Methods

from :: ChannelType a -> Rep (ChannelType a) x #

to :: Rep (ChannelType a) x -> ChannelType a #

Generic1 ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ChannelType :: k -> Type #

Methods

from1 :: forall (a :: k). ChannelType a -> Rep1 ChannelType a #

to1 :: forall (a :: k). Rep1 ChannelType a -> ChannelType a #

type Rep (ChannelType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ChannelType a) = D1 ('MetaData "ChannelType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ChannelType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))
type Rep1 ChannelType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ChannelType = D1 ('MetaData "ChannelType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ChannelType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type)))

data CallExpression a Source #

Constructors

CallExpression 

Fields

Instances

Instances details
Functor CallExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> CallExpression a -> CallExpression b #

(<$) :: a -> CallExpression b -> CallExpression a #

Foldable CallExpression Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal CallExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (CallExpression a)

Eq a => Eq (CallExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (CallExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (CallExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (CallExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (CallExpression a) :: Type -> Type #

Generic1 CallExpression Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (CallExpression a) = D1 ('MetaData "CallExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 (ArgumentList a)))))
type Rep1 CallExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 CallExpression = D1 ('MetaData "CallExpression" "TreeSitter.Go.AST" "tree-sitter-go-0.3.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 ArgumentList))))

data BreakStatement a Source #

Constructors

BreakStatement 

Fields

Instances

Instances details
Functor BreakStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> BreakStatement a -> BreakStatement b #

(<$) :: a -> BreakStatement b -> BreakStatement a #

Foldable BreakStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal BreakStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (BreakStatement a)

Eq a => Eq (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (BreakStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (BreakStatement a) :: Type -> Type #

Generic1 BreakStatement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep (BreakStatement a) = D1 ('MetaData "BreakStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "BreakStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (LabelName a)))))
type Rep1 BreakStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 BreakStatement = D1 ('MetaData "BreakStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "BreakStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Maybe :.: Rec1 LabelName)))

data Block a Source #

Constructors

Block 

Fields

Instances

Instances details
Functor Block Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> Block a -> Block b #

(<$) :: a -> Block b -> Block a #

Foldable Block Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => Block m -> m #

foldMap :: Monoid m => (a -> m) -> Block a -> m #

foldMap' :: Monoid m => (a -> m) -> Block a -> m #

foldr :: (a -> b -> b) -> b -> Block a -> b #

foldr' :: (a -> b -> b) -> b -> Block a -> b #

foldl :: (b -> a -> b) -> b -> Block a -> b #

foldl' :: (b -> a -> b) -> b -> Block a -> b #

foldr1 :: (a -> a -> a) -> Block a -> a #

foldl1 :: (a -> a -> a) -> Block a -> a #

toList :: Block a -> [a] #

null :: Block a -> Bool #

length :: Block a -> Int #

elem :: Eq a => a -> Block a -> Bool #

maximum :: Ord a => Block a -> a #

minimum :: Ord a => Block a -> a #

sum :: Num a => Block a -> a #

product :: Num a => Block a -> a #

Traversable Block Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> Block a -> f (Block b) #

sequenceA :: Applicative f => Block (f a) -> f (Block a) #

mapM :: Monad m => (a -> m b) -> Block a -> m (Block b) #

sequence :: Monad m => Block (m a) -> m (Block a) #

SymbolMatching Block Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy Block -> Node -> Bool

showFailure :: Proxy Block -> Node -> String

Unmarshal Block Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Block a)

Eq a => Eq (Block a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: Block a -> Block a -> Bool #

(/=) :: Block a -> Block a -> Bool #

Ord a => Ord (Block a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

compare :: Block a -> Block a -> Ordering #

(<) :: Block a -> Block a -> Bool #

(<=) :: Block a -> Block a -> Bool #

(>) :: Block a -> Block a -> Bool #

(>=) :: Block a -> Block a -> Bool #

max :: Block a -> Block a -> Block a #

min :: Block a -> Block a -> Block a #

Show a => Show (Block a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

showsPrec :: Int -> Block a -> ShowS #

show :: Block a -> String #

showList :: [Block a] -> ShowS #

Generic (Block a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (Block a) :: Type -> Type #

Methods

from :: Block a -> Rep (Block a) x #

to :: Rep (Block a) x -> Block a #

Generic1 Block Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 Block :: k -> Type #

Methods

from1 :: forall (a :: k). Block a -> Rep1 Block a #

to1 :: forall (a :: k). Rep1 Block a -> Block a #

type Rep (Block a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (Block a) = D1 ('MetaData "Block" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "Block" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Statement a])))
type Rep1 Block Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 Block = D1 ('MetaData "Block" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "Block" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 Statement)))

data BinaryExpression a Source #

Instances

Instances details
Functor BinaryExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> BinaryExpression a -> BinaryExpression b #

(<$) :: a -> BinaryExpression b -> BinaryExpression a #

Foldable BinaryExpression Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal BinaryExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (BinaryExpression a)

Eq a => Eq (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (BinaryExpression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (BinaryExpression a) :: Type -> Type #

Generic1 BinaryExpression Source # 
Instance details

Defined in TreeSitter.Go.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.Go.AST

type Rep1 BinaryExpression Source # 
Instance details

Defined in TreeSitter.Go.AST

data AssignmentStatement a Source #

Instances

Instances details
Functor AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Foldable AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => AssignmentStatement m -> m #

foldMap :: Monoid m => (a -> m) -> AssignmentStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> AssignmentStatement a -> m #

foldr :: (a -> b -> b) -> b -> AssignmentStatement a -> b #

foldr' :: (a -> b -> b) -> b -> AssignmentStatement a -> b #

foldl :: (b -> a -> b) -> b -> AssignmentStatement a -> b #

foldl' :: (b -> a -> b) -> b -> AssignmentStatement a -> b #

foldr1 :: (a -> a -> a) -> AssignmentStatement a -> a #

foldl1 :: (a -> a -> a) -> AssignmentStatement a -> a #

toList :: AssignmentStatement a -> [a] #

null :: AssignmentStatement a -> Bool #

length :: AssignmentStatement a -> Int #

elem :: Eq a => a -> AssignmentStatement a -> Bool #

maximum :: Ord a => AssignmentStatement a -> a #

minimum :: Ord a => AssignmentStatement a -> a #

sum :: Num a => AssignmentStatement a -> a #

product :: Num a => AssignmentStatement a -> a #

Traversable AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

SymbolMatching AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (AssignmentStatement a)

Eq a => Eq (AssignmentStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (AssignmentStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (AssignmentStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (AssignmentStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (AssignmentStatement a) :: Type -> Type #

Generic1 AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 AssignmentStatement :: k -> Type #

Methods

from1 :: forall (a :: k). AssignmentStatement a -> Rep1 AssignmentStatement a #

to1 :: forall (a :: k). Rep1 AssignmentStatement a -> AssignmentStatement a #

type Rep (AssignmentStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 AssignmentStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

data ArrayType a Source #

Constructors

ArrayType 

Fields

Instances

Instances details
Functor ArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ArrayType a -> ArrayType b #

(<$) :: a -> ArrayType b -> ArrayType a #

Foldable ArrayType Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Methods

symbolMatch :: Proxy ArrayType -> Node -> Bool

showFailure :: Proxy ArrayType -> Node -> String

Unmarshal ArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ArrayType a)

Eq a => Eq (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: ArrayType a -> ArrayType a -> Bool #

(/=) :: ArrayType a -> ArrayType a -> Bool #

Ord a => Ord (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ArrayType a) Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

type Rep (ArrayType a) = D1 ('MetaData "ArrayType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ArrayType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "length") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expression a)) :*: S1 ('MetaSel ('Just "element") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))
type Rep1 ArrayType Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ArrayType = D1 ('MetaData "ArrayType" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ArrayType" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: (S1 ('MetaSel ('Just "length") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Expression) :*: S1 ('MetaSel ('Just "element") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Type))))

data ArgumentList a Source #

Constructors

ArgumentList 

Instances

Instances details
Functor ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> ArgumentList a -> ArgumentList b #

(<$) :: a -> ArgumentList b -> ArgumentList a #

Foldable ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => ArgumentList m -> m #

foldMap :: Monoid m => (a -> m) -> ArgumentList a -> m #

foldMap' :: Monoid m => (a -> m) -> ArgumentList a -> m #

foldr :: (a -> b -> b) -> b -> ArgumentList a -> b #

foldr' :: (a -> b -> b) -> b -> ArgumentList a -> b #

foldl :: (b -> a -> b) -> b -> ArgumentList a -> b #

foldl' :: (b -> a -> b) -> b -> ArgumentList a -> b #

foldr1 :: (a -> a -> a) -> ArgumentList a -> a #

foldl1 :: (a -> a -> a) -> ArgumentList a -> a #

toList :: ArgumentList a -> [a] #

null :: ArgumentList a -> Bool #

length :: ArgumentList a -> Int #

elem :: Eq a => a -> ArgumentList a -> Bool #

maximum :: Ord a => ArgumentList a -> a #

minimum :: Ord a => ArgumentList a -> a #

sum :: Num a => ArgumentList a -> a #

product :: Num a => ArgumentList a -> a #

Traversable ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> ArgumentList a -> f (ArgumentList b) #

sequenceA :: Applicative f => ArgumentList (f a) -> f (ArgumentList a) #

mapM :: Monad m => (a -> m b) -> ArgumentList a -> m (ArgumentList b) #

sequence :: Monad m => ArgumentList (m a) -> m (ArgumentList a) #

SymbolMatching ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (ArgumentList a)

Eq a => Eq (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (ArgumentList a) :: Type -> Type #

Methods

from :: ArgumentList a -> Rep (ArgumentList a) x #

to :: Rep (ArgumentList a) x -> ArgumentList a #

Generic1 ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 ArgumentList :: k -> Type #

Methods

from1 :: forall (a :: k). ArgumentList a -> Rep1 ArgumentList a #

to1 :: forall (a :: k). Rep1 ArgumentList a -> ArgumentList a #

type Rep (ArgumentList a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (ArgumentList a) = D1 ('MetaData "ArgumentList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ArgumentList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Expression :+: (Type :+: VariadicArgument)) a])))
type Rep1 ArgumentList Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 ArgumentList = D1 ('MetaData "ArgumentList" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'False) (C1 ('MetaCons "ArgumentList" 'PrefixI 'True) (S1 ('MetaSel ('Just "ann") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Just "extraChildren") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ([] :.: Rec1 (Expression :+: (Type :+: VariadicArgument)))))

newtype Type a Source #

Instances

Instances details
Functor Type Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> Type a -> Type b #

(<$) :: a -> Type b -> Type a #

Foldable Type Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => Type m -> m #

foldMap :: Monoid m => (a -> m) -> Type a -> m #

foldMap' :: Monoid m => (a -> m) -> Type a -> m #

foldr :: (a -> b -> b) -> b -> Type a -> b #

foldr' :: (a -> b -> b) -> b -> Type a -> b #

foldl :: (b -> a -> b) -> b -> Type a -> b #

foldl' :: (b -> a -> b) -> b -> Type a -> b #

foldr1 :: (a -> a -> a) -> Type a -> a #

foldl1 :: (a -> a -> a) -> Type a -> a #

toList :: Type a -> [a] #

null :: Type a -> Bool #

length :: Type a -> Int #

elem :: Eq a => a -> Type a -> Bool #

maximum :: Ord a => Type a -> a #

minimum :: Ord a => Type a -> a #

sum :: Num a => Type a -> a #

product :: Num a => Type a -> a #

Traversable Type Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> Type a -> f (Type b) #

sequenceA :: Applicative f => Type (f a) -> f (Type a) #

mapM :: Monad m => (a -> m b) -> Type a -> m (Type b) #

sequence :: Monad m => Type (m a) -> m (Type a) #

SymbolMatching Type Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

symbolMatch :: Proxy Type -> Node -> Bool

showFailure :: Proxy Type -> Node -> String

Unmarshal Type Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type0 -> Type0) -> Type0 -> Type0) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Type a)

Eq a => Eq (Type a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: Type a -> Type a -> Bool #

(/=) :: Type a -> Type a -> Bool #

Ord a => Ord (Type a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

compare :: Type a -> Type a -> Ordering #

(<) :: Type a -> Type a -> Bool #

(<=) :: Type a -> Type a -> Bool #

(>) :: Type a -> Type a -> Bool #

(>=) :: Type a -> Type a -> Bool #

max :: Type a -> Type a -> Type a #

min :: Type a -> Type a -> Type a #

Show a => Show (Type a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

showsPrec :: Int -> Type a -> ShowS #

show :: Type a -> String #

showList :: [Type a] -> ShowS #

Generic (Type a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (Type a) :: Type -> Type #

Methods

from :: Type a -> Rep (Type a) x #

to :: Rep (Type a) x -> Type a #

Generic1 Type Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 Type :: k -> Type #

Methods

from1 :: forall (a :: k). Type a -> Rep1 Type a #

to1 :: forall (a :: k). Rep1 Type a -> Type a #

type Rep (Type a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (Type a) = D1 ('MetaData "Type" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'True) (C1 ('MetaCons "Type" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((SimpleType :+: ParenthesizedType) a))))
type Rep1 Type Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 Type = D1 ('MetaData "Type" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'True) (C1 ('MetaCons "Type" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (SimpleType :+: ParenthesizedType))))

newtype Statement a Source #

Instances

Instances details
Functor Statement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> Statement a -> Statement b #

(<$) :: a -> Statement b -> Statement a #

Foldable Statement Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Methods

symbolMatch :: Proxy Statement -> Node -> Bool

showFailure :: Proxy Statement -> Node -> String

Unmarshal Statement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Statement a)

Eq a => Eq (Statement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: Statement a -> Statement a -> Bool #

(/=) :: Statement a -> Statement a -> Bool #

Ord a => Ord (Statement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (Statement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (Statement a) Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

type Rep1 Statement Source # 
Instance details

Defined in TreeSitter.Go.AST

newtype SimpleType a Source #

Instances

Instances details
Functor SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> SimpleType a -> SimpleType b #

(<$) :: a -> SimpleType b -> SimpleType a #

Foldable SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => SimpleType m -> m #

foldMap :: Monoid m => (a -> m) -> SimpleType a -> m #

foldMap' :: Monoid m => (a -> m) -> SimpleType a -> m #

foldr :: (a -> b -> b) -> b -> SimpleType a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleType a -> b #

foldl :: (b -> a -> b) -> b -> SimpleType a -> b #

foldl' :: (b -> a -> b) -> b -> SimpleType a -> b #

foldr1 :: (a -> a -> a) -> SimpleType a -> a #

foldl1 :: (a -> a -> a) -> SimpleType a -> a #

toList :: SimpleType a -> [a] #

null :: SimpleType a -> Bool #

length :: SimpleType a -> Int #

elem :: Eq a => a -> SimpleType a -> Bool #

maximum :: Ord a => SimpleType a -> a #

minimum :: Ord a => SimpleType a -> a #

sum :: Num a => SimpleType a -> a #

product :: Num a => SimpleType a -> a #

Traversable SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> SimpleType a -> f (SimpleType b) #

sequenceA :: Applicative f => SimpleType (f a) -> f (SimpleType a) #

mapM :: Monad m => (a -> m b) -> SimpleType a -> m (SimpleType b) #

sequence :: Monad m => SimpleType (m a) -> m (SimpleType a) #

SymbolMatching SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (SimpleType a)

Eq a => Eq (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: SimpleType a -> SimpleType a -> Bool #

(/=) :: SimpleType a -> SimpleType a -> Bool #

Ord a => Ord (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (SimpleType a) :: Type -> Type #

Methods

from :: SimpleType a -> Rep (SimpleType a) x #

to :: Rep (SimpleType a) x -> SimpleType a #

Generic1 SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SimpleType :: k -> Type #

Methods

from1 :: forall (a :: k). SimpleType a -> Rep1 SimpleType a #

to1 :: forall (a :: k). Rep1 SimpleType a -> SimpleType a #

type Rep (SimpleType a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SimpleType Source # 
Instance details

Defined in TreeSitter.Go.AST

newtype SimpleStatement a Source #

Instances

Instances details
Functor SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> SimpleStatement a -> SimpleStatement b #

(<$) :: a -> SimpleStatement b -> SimpleStatement a #

Foldable SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fold :: Monoid m => SimpleStatement m -> m #

foldMap :: Monoid m => (a -> m) -> SimpleStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> SimpleStatement a -> m #

foldr :: (a -> b -> b) -> b -> SimpleStatement a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleStatement a -> b #

foldl :: (b -> a -> b) -> b -> SimpleStatement a -> b #

foldl' :: (b -> a -> b) -> b -> SimpleStatement a -> b #

foldr1 :: (a -> a -> a) -> SimpleStatement a -> a #

foldl1 :: (a -> a -> a) -> SimpleStatement a -> a #

toList :: SimpleStatement a -> [a] #

null :: SimpleStatement a -> Bool #

length :: SimpleStatement a -> Int #

elem :: Eq a => a -> SimpleStatement a -> Bool #

maximum :: Ord a => SimpleStatement a -> a #

minimum :: Ord a => SimpleStatement a -> a #

sum :: Num a => SimpleStatement a -> a #

product :: Num a => SimpleStatement a -> a #

Traversable SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

traverse :: Applicative f => (a -> f b) -> SimpleStatement a -> f (SimpleStatement b) #

sequenceA :: Applicative f => SimpleStatement (f a) -> f (SimpleStatement a) #

mapM :: Monad m => (a -> m b) -> SimpleStatement a -> m (SimpleStatement b) #

sequence :: Monad m => SimpleStatement (m a) -> m (SimpleStatement a) #

SymbolMatching SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Unmarshal SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (SimpleStatement a)

Eq a => Eq (SimpleStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Ord a => Ord (SimpleStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (SimpleStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (SimpleStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep (SimpleStatement a) :: Type -> Type #

Generic1 SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

Associated Types

type Rep1 SimpleStatement :: k -> Type #

Methods

from1 :: forall (a :: k). SimpleStatement a -> Rep1 SimpleStatement a #

to1 :: forall (a :: k). Rep1 SimpleStatement a -> SimpleStatement a #

type Rep (SimpleStatement a) Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep (SimpleStatement a) = D1 ('MetaData "SimpleStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'True) (C1 ('MetaCons "SimpleStatement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (((Expression :+: (AssignmentStatement :+: DecStatement)) :+: (IncStatement :+: (SendStatement :+: ShortVarDeclaration))) a))))
type Rep1 SimpleStatement Source # 
Instance details

Defined in TreeSitter.Go.AST

type Rep1 SimpleStatement = D1 ('MetaData "SimpleStatement" "TreeSitter.Go.AST" "tree-sitter-go-0.3.1.0-inplace" 'True) (C1 ('MetaCons "SimpleStatement" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 ((Expression :+: (AssignmentStatement :+: DecStatement)) :+: (IncStatement :+: (SendStatement :+: ShortVarDeclaration))))))

newtype Expression a Source #

Instances

Instances details
Functor Expression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

fmap :: (a -> b) -> Expression a -> Expression b #

(<$) :: a -> Expression b -> Expression a #

Foldable Expression Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

Unmarshal Expression Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

unmarshalNode :: forall (sig :: (Type -> Type) -> Type -> Type) m a. (Has (Reader ByteString) sig m, Has (Reader (Ptr Cursor)) sig m, MonadFail m, MonadIO m, UnmarshalAnn a) => Node -> m (Expression a)

Eq a => Eq (Expression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Methods

(==) :: Expression a -> Expression a -> Bool #

(/=) :: Expression a -> Expression a -> Bool #

Ord a => Ord (Expression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Show a => Show (Expression a) Source # 
Instance details

Defined in TreeSitter.Go.AST

Generic (Expression a) Source # 
Instance details

Defined in TreeSitter.Go.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.Go.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.Go.AST

type Rep1 Expression Source # 
Instance details

Defined in TreeSitter.Go.AST