tree-sitter-python-0.1.0.1: Tree-sitter grammar/parser for Python

Safe HaskellNone
LanguageHaskell2010

TreeSitter.Python.AST

Documentation

newtype Await Source #

Constructors

Await 

Fields

Instances
Eq Await Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Await -> Await -> Bool #

(/=) :: Await -> Await -> Bool #

Ord Await Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Await -> Await -> Ordering #

(<) :: Await -> Await -> Bool #

(<=) :: Await -> Await -> Bool #

(>) :: Await -> Await -> Bool #

(>=) :: Await -> Await -> Bool #

max :: Await -> Await -> Await #

min :: Await -> Await -> Await #

Show Await Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Await -> ShowS #

show :: Await -> String #

showList :: [Await] -> ShowS #

newtype Chevron Source #

Constructors

Chevron 

Fields

Instances
Eq Chevron Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Chevron -> Chevron -> Bool #

(/=) :: Chevron -> Chevron -> Bool #

Ord Chevron Source # 
Instance details

Defined in TreeSitter.Python.AST

Show Chevron Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype IfClause Source #

Constructors

IfClause 

Fields

Instances
Eq IfClause Source # 
Instance details

Defined in TreeSitter.Python.AST

Ord IfClause Source # 
Instance details

Defined in TreeSitter.Python.AST

Show IfClause Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype List Source #

Constructors

List 

Fields

Instances
Eq List Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: List -> List -> Bool #

(/=) :: List -> List -> Bool #

Ord List Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: List -> List -> Ordering #

(<) :: List -> List -> Bool #

(<=) :: List -> List -> Bool #

(>) :: List -> List -> Bool #

(>=) :: List -> List -> Bool #

max :: List -> List -> List #

min :: List -> List -> List #

Show List Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> List -> ShowS #

show :: List -> String #

showList :: [List] -> ShowS #

newtype Pair Source #

Constructors

Pair 

Fields

Instances
Eq Pair Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Pair -> Pair -> Bool #

(/=) :: Pair -> Pair -> Bool #

Ord Pair Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Pair -> Pair -> Ordering #

(<) :: Pair -> Pair -> Bool #

(<=) :: Pair -> Pair -> Bool #

(>) :: Pair -> Pair -> Bool #

(>=) :: Pair -> Pair -> Bool #

max :: Pair -> Pair -> Pair #

min :: Pair -> Pair -> Pair #

Show Pair Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Pair -> ShowS #

show :: Pair -> String #

showList :: [Pair] -> ShowS #

newtype Set Source #

Constructors

Set 

Fields

Instances
Eq Set Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Set -> Set -> Bool #

(/=) :: Set -> Set -> Bool #

Ord Set Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Set -> Set -> Ordering #

(<) :: Set -> Set -> Bool #

(<=) :: Set -> Set -> Bool #

(>) :: Set -> Set -> Bool #

(>=) :: Set -> Set -> Bool #

max :: Set -> Set -> Set #

min :: Set -> Set -> Set #

Show Set Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Set -> ShowS #

show :: Set -> String #

showList :: [Set] -> ShowS #

newtype Slice Source #

Constructors

Slice 

Fields

Instances
Eq Slice Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Slice -> Slice -> Bool #

(/=) :: Slice -> Slice -> Bool #

Ord Slice Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Slice -> Slice -> Ordering #

(<) :: Slice -> Slice -> Bool #

(<=) :: Slice -> Slice -> Bool #

(>) :: Slice -> Slice -> Bool #

(>=) :: Slice -> Slice -> Bool #

max :: Slice -> Slice -> Slice #

min :: Slice -> Slice -> Slice #

Show Slice Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Slice -> ShowS #

show :: Slice -> String #

showList :: [Slice] -> ShowS #

newtype String Source #

Constructors

String 

Fields

Instances
Eq String Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

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

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

Ord String Source # 
Instance details

Defined in TreeSitter.Python.AST

Show String Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype Tuple Source #

Constructors

Tuple 

Fields

Instances
Eq Tuple Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Tuple -> Tuple -> Bool #

(/=) :: Tuple -> Tuple -> Bool #

Ord Tuple Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Tuple -> Tuple -> Ordering #

(<) :: Tuple -> Tuple -> Bool #

(<=) :: Tuple -> Tuple -> Bool #

(>) :: Tuple -> Tuple -> Bool #

(>=) :: Tuple -> Tuple -> Bool #

max :: Tuple -> Tuple -> Tuple #

min :: Tuple -> Tuple -> Tuple #

Show Tuple Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Tuple -> ShowS #

show :: Tuple -> String #

showList :: [Tuple] -> ShowS #

newtype Type Source #

Constructors

Type 

Fields

Instances
Eq Type Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Type -> Type -> Bool #

(/=) :: Type -> Type -> Bool #

Ord Type Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Type -> Type -> Ordering #

(<) :: Type -> Type -> Bool #

(<=) :: Type -> Type -> Bool #

(>) :: Type -> Type -> Bool #

(>=) :: Type -> Type -> Bool #

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Show Type Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

newtype WithItem Source #

Constructors

WithItem 

Fields

Instances
Eq WithItem Source # 
Instance details

Defined in TreeSitter.Python.AST

Ord WithItem Source # 
Instance details

Defined in TreeSitter.Python.AST

Show WithItem Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype Yield Source #

Constructors

Yield 

Fields

Instances
Eq Yield Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Yield -> Yield -> Bool #

(/=) :: Yield -> Yield -> Bool #

Ord Yield Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Yield -> Yield -> Ordering #

(<) :: Yield -> Yield -> Bool #

(<=) :: Yield -> Yield -> Bool #

(>) :: Yield -> Yield -> Bool #

(>=) :: Yield -> Yield -> Bool #

max :: Yield -> Yield -> Yield #

min :: Yield -> Yield -> Yield #

Show Yield Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Yield -> ShowS #

show :: Yield -> String #

showList :: [Yield] -> ShowS #

newtype Ellipsis Source #

Constructors

Ellipsis 

Fields

Instances
Eq Ellipsis Source # 
Instance details

Defined in TreeSitter.Python.AST

Ord Ellipsis Source # 
Instance details

Defined in TreeSitter.Python.AST

Show Ellipsis Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype Integer Source #

Constructors

Integer 

Fields

Instances
Eq Integer Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Ord Integer Source # 
Instance details

Defined in TreeSitter.Python.AST

Show Integer Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype Float Source #

Constructors

Float 

Fields

Instances
Eq Float Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Float -> Float -> Bool #

(/=) :: Float -> Float -> Bool #

Ord Float Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Show Float Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Float -> ShowS #

show :: Float -> String #

showList :: [Float] -> ShowS #

newtype True Source #

Constructors

True 

Fields

Instances
Eq True Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

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

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

Ord True Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: True -> True -> Ordering #

(<) :: True -> True -> Bool #

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

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

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

max :: True -> True -> True #

min :: True -> True -> True #

Show True Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> True -> ShowS #

show :: True -> String #

showList :: [True] -> ShowS #

newtype False Source #

Constructors

False 

Fields

Instances
Eq False Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

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

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

Ord False Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: False -> False -> Ordering #

(<) :: False -> False -> Bool #

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

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

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

max :: False -> False -> False #

min :: False -> False -> False #

Show False Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> False -> ShowS #

show :: False -> String #

showList :: [False] -> ShowS #

newtype None Source #

Constructors

None 

Fields

Instances
Eq None Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: None -> None -> Bool #

(/=) :: None -> None -> Bool #

Ord None Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: None -> None -> Ordering #

(<) :: None -> None -> Bool #

(<=) :: None -> None -> Bool #

(>) :: None -> None -> Bool #

(>=) :: None -> None -> Bool #

max :: None -> None -> None #

min :: None -> None -> None #

Show None Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> None -> ShowS #

show :: None -> String #

showList :: [None] -> ShowS #

data PrimaryExpression Source #

data Call Source #

Instances
Eq Call Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Call -> Call -> Bool #

(/=) :: Call -> Call -> Bool #

Ord Call Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Call -> Call -> Ordering #

(<) :: Call -> Call -> Bool #

(<=) :: Call -> Call -> Bool #

(>) :: Call -> Call -> Bool #

(>=) :: Call -> Call -> Bool #

max :: Call -> Call -> Call #

min :: Call -> Call -> Call #

Show Call Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Call -> ShowS #

show :: Call -> String #

showList :: [Call] -> ShowS #

data Lambda Source #

Instances
Eq Lambda Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Lambda -> Lambda -> Bool #

(/=) :: Lambda -> Lambda -> Bool #

Ord Lambda Source # 
Instance details

Defined in TreeSitter.Python.AST

Show Lambda Source # 
Instance details

Defined in TreeSitter.Python.AST

data SimpleStatement Source #

data Block Source #

Instances
Eq Block Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Block -> Block -> Bool #

(/=) :: Block -> Block -> Bool #

Ord Block Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

compare :: Block -> Block -> Ordering #

(<) :: Block -> Block -> Bool #

(<=) :: Block -> Block -> Bool #

(>) :: Block -> Block -> Bool #

(>=) :: Block -> Block -> Bool #

max :: Block -> Block -> Block #

min :: Block -> Block -> Block #

Show Block Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

data Module Source #

Instances
Eq Module Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Ord Module Source # 
Instance details

Defined in TreeSitter.Python.AST

Show Module Source # 
Instance details

Defined in TreeSitter.Python.AST

newtype Comment Source #

Constructors

Comment 

Fields

Instances
Eq Comment Source # 
Instance details

Defined in TreeSitter.Python.AST

Methods

(==) :: Comment -> Comment -> Bool #

(/=) :: Comment -> Comment -> Bool #

Ord Comment Source # 
Instance details

Defined in TreeSitter.Python.AST

Show Comment Source # 
Instance details

Defined in TreeSitter.Python.AST