| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
TreeSitter.Python.AST
Documentation
newtype ArgumentList Source #
Constructors
| ArgumentList | |
Instances
| Eq ArgumentList Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ArgumentList Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ArgumentList -> ArgumentList -> Ordering # (<) :: ArgumentList -> ArgumentList -> Bool # (<=) :: ArgumentList -> ArgumentList -> Bool # (>) :: ArgumentList -> ArgumentList -> Bool # (>=) :: ArgumentList -> ArgumentList -> Bool # max :: ArgumentList -> ArgumentList -> ArgumentList # min :: ArgumentList -> ArgumentList -> ArgumentList # | |
| Show ArgumentList Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ArgumentList -> ShowS # show :: ArgumentList -> String # showList :: [ArgumentList] -> ShowS # | |
newtype AssertStatement Source #
Constructors
| AssertStatement | |
Instances
| Eq AssertStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AssertStatement -> AssertStatement -> Bool # (/=) :: AssertStatement -> AssertStatement -> Bool # | |
| Ord AssertStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AssertStatement -> AssertStatement -> Ordering # (<) :: AssertStatement -> AssertStatement -> Bool # (<=) :: AssertStatement -> AssertStatement -> Bool # (>) :: AssertStatement -> AssertStatement -> Bool # (>=) :: AssertStatement -> AssertStatement -> Bool # max :: AssertStatement -> AssertStatement -> AssertStatement # min :: AssertStatement -> AssertStatement -> AssertStatement # | |
| Show AssertStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AssertStatement -> ShowS # show :: AssertStatement -> String # showList :: [AssertStatement] -> ShowS # | |
Instances
| Eq Attribute Source # | |
| Ord Attribute Source # | |
| Show Attribute Source # | |
newtype BreakStatement Source #
Constructors
| BreakStatement | |
Instances
| Eq BreakStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: BreakStatement -> BreakStatement -> Bool # (/=) :: BreakStatement -> BreakStatement -> Bool # | |
| Ord BreakStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: BreakStatement -> BreakStatement -> Ordering # (<) :: BreakStatement -> BreakStatement -> Bool # (<=) :: BreakStatement -> BreakStatement -> Bool # (>) :: BreakStatement -> BreakStatement -> Bool # (>=) :: BreakStatement -> BreakStatement -> Bool # max :: BreakStatement -> BreakStatement -> BreakStatement # min :: BreakStatement -> BreakStatement -> BreakStatement # | |
| Show BreakStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> BreakStatement -> ShowS # show :: BreakStatement -> String # showList :: [BreakStatement] -> ShowS # | |
newtype ComparisonOperator Source #
Constructors
| ComparisonOperator | |
Instances
| Eq ComparisonOperator Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ComparisonOperator -> ComparisonOperator -> Bool # (/=) :: ComparisonOperator -> ComparisonOperator -> Bool # | |
| Ord ComparisonOperator Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ComparisonOperator -> ComparisonOperator -> Ordering # (<) :: ComparisonOperator -> ComparisonOperator -> Bool # (<=) :: ComparisonOperator -> ComparisonOperator -> Bool # (>) :: ComparisonOperator -> ComparisonOperator -> Bool # (>=) :: ComparisonOperator -> ComparisonOperator -> Bool # max :: ComparisonOperator -> ComparisonOperator -> ComparisonOperator # min :: ComparisonOperator -> ComparisonOperator -> ComparisonOperator # | |
| Show ComparisonOperator Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ComparisonOperator -> ShowS # show :: ComparisonOperator -> String # showList :: [ComparisonOperator] -> ShowS # | |
newtype ConcatenatedString Source #
Constructors
| ConcatenatedString | |
Instances
| Eq ConcatenatedString Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ConcatenatedString -> ConcatenatedString -> Bool # (/=) :: ConcatenatedString -> ConcatenatedString -> Bool # | |
| Ord ConcatenatedString Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ConcatenatedString -> ConcatenatedString -> Ordering # (<) :: ConcatenatedString -> ConcatenatedString -> Bool # (<=) :: ConcatenatedString -> ConcatenatedString -> Bool # (>) :: ConcatenatedString -> ConcatenatedString -> Bool # (>=) :: ConcatenatedString -> ConcatenatedString -> Bool # max :: ConcatenatedString -> ConcatenatedString -> ConcatenatedString # min :: ConcatenatedString -> ConcatenatedString -> ConcatenatedString # | |
| Show ConcatenatedString Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ConcatenatedString -> ShowS # show :: ConcatenatedString -> String # showList :: [ConcatenatedString] -> ShowS # | |
newtype ConditionalExpression Source #
Constructors
| ConditionalExpression | |
Instances
| Eq ConditionalExpression Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ConditionalExpression -> ConditionalExpression -> Bool # (/=) :: ConditionalExpression -> ConditionalExpression -> Bool # | |
| Ord ConditionalExpression Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ConditionalExpression -> ConditionalExpression -> Ordering # (<) :: ConditionalExpression -> ConditionalExpression -> Bool # (<=) :: ConditionalExpression -> ConditionalExpression -> Bool # (>) :: ConditionalExpression -> ConditionalExpression -> Bool # (>=) :: ConditionalExpression -> ConditionalExpression -> Bool # max :: ConditionalExpression -> ConditionalExpression -> ConditionalExpression # min :: ConditionalExpression -> ConditionalExpression -> ConditionalExpression # | |
| Show ConditionalExpression Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ConditionalExpression -> ShowS # show :: ConditionalExpression -> String # showList :: [ConditionalExpression] -> ShowS # | |
newtype ContinueStatement Source #
Constructors
| ContinueStatement | |
Instances
| Eq ContinueStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ContinueStatement -> ContinueStatement -> Bool # (/=) :: ContinueStatement -> ContinueStatement -> Bool # | |
| Ord ContinueStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ContinueStatement -> ContinueStatement -> Ordering # (<) :: ContinueStatement -> ContinueStatement -> Bool # (<=) :: ContinueStatement -> ContinueStatement -> Bool # (>) :: ContinueStatement -> ContinueStatement -> Bool # (>=) :: ContinueStatement -> ContinueStatement -> Bool # max :: ContinueStatement -> ContinueStatement -> ContinueStatement # min :: ContinueStatement -> ContinueStatement -> ContinueStatement # | |
| Show ContinueStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ContinueStatement -> ShowS # show :: ContinueStatement -> String # showList :: [ContinueStatement] -> ShowS # | |
newtype DecoratedDefinition Source #
Constructors
| DecoratedDefinition | |
Instances
| Eq DecoratedDefinition Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: DecoratedDefinition -> DecoratedDefinition -> Bool # (/=) :: DecoratedDefinition -> DecoratedDefinition -> Bool # | |
| Ord DecoratedDefinition Source # | |
Defined in TreeSitter.Python.AST Methods compare :: DecoratedDefinition -> DecoratedDefinition -> Ordering # (<) :: DecoratedDefinition -> DecoratedDefinition -> Bool # (<=) :: DecoratedDefinition -> DecoratedDefinition -> Bool # (>) :: DecoratedDefinition -> DecoratedDefinition -> Bool # (>=) :: DecoratedDefinition -> DecoratedDefinition -> Bool # max :: DecoratedDefinition -> DecoratedDefinition -> DecoratedDefinition # min :: DecoratedDefinition -> DecoratedDefinition -> DecoratedDefinition # | |
| Show DecoratedDefinition Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> DecoratedDefinition -> ShowS # show :: DecoratedDefinition -> String # showList :: [DecoratedDefinition] -> ShowS # | |
Instances
| Eq Decorator Source # | |
| Ord Decorator Source # | |
| Show Decorator Source # | |
newtype DefaultParameter Source #
Constructors
| DefaultParameter | |
Instances
| Eq DefaultParameter Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: DefaultParameter -> DefaultParameter -> Bool # (/=) :: DefaultParameter -> DefaultParameter -> Bool # | |
| Ord DefaultParameter Source # | |
Defined in TreeSitter.Python.AST Methods compare :: DefaultParameter -> DefaultParameter -> Ordering # (<) :: DefaultParameter -> DefaultParameter -> Bool # (<=) :: DefaultParameter -> DefaultParameter -> Bool # (>) :: DefaultParameter -> DefaultParameter -> Bool # (>=) :: DefaultParameter -> DefaultParameter -> Bool # max :: DefaultParameter -> DefaultParameter -> DefaultParameter # min :: DefaultParameter -> DefaultParameter -> DefaultParameter # | |
| Show DefaultParameter Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> DefaultParameter -> ShowS # show :: DefaultParameter -> String # showList :: [DefaultParameter] -> ShowS # | |
newtype DeleteStatement Source #
Constructors
| DeleteStatement | |
Instances
| Eq DeleteStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: DeleteStatement -> DeleteStatement -> Bool # (/=) :: DeleteStatement -> DeleteStatement -> Bool # | |
| Ord DeleteStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: DeleteStatement -> DeleteStatement -> Ordering # (<) :: DeleteStatement -> DeleteStatement -> Bool # (<=) :: DeleteStatement -> DeleteStatement -> Bool # (>) :: DeleteStatement -> DeleteStatement -> Bool # (>=) :: DeleteStatement -> DeleteStatement -> Bool # max :: DeleteStatement -> DeleteStatement -> DeleteStatement # min :: DeleteStatement -> DeleteStatement -> DeleteStatement # | |
| Show DeleteStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> DeleteStatement -> ShowS # show :: DeleteStatement -> String # showList :: [DeleteStatement] -> ShowS # | |
newtype Dictionary Source #
Constructors
| Dictionary | |
Instances
| Eq Dictionary Source # | |
Defined in TreeSitter.Python.AST | |
| Ord Dictionary Source # | |
Defined in TreeSitter.Python.AST Methods compare :: Dictionary -> Dictionary -> Ordering # (<) :: Dictionary -> Dictionary -> Bool # (<=) :: Dictionary -> Dictionary -> Bool # (>) :: Dictionary -> Dictionary -> Bool # (>=) :: Dictionary -> Dictionary -> Bool # max :: Dictionary -> Dictionary -> Dictionary # min :: Dictionary -> Dictionary -> Dictionary # | |
| Show Dictionary Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> Dictionary -> ShowS # show :: Dictionary -> String # showList :: [Dictionary] -> ShowS # | |
newtype DictionaryComprehension Source #
Constructors
| DictionaryComprehension | |
Instances
newtype DictionarySplat Source #
Constructors
| DictionarySplat | |
Instances
| Eq DictionarySplat Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: DictionarySplat -> DictionarySplat -> Bool # (/=) :: DictionarySplat -> DictionarySplat -> Bool # | |
| Ord DictionarySplat Source # | |
Defined in TreeSitter.Python.AST Methods compare :: DictionarySplat -> DictionarySplat -> Ordering # (<) :: DictionarySplat -> DictionarySplat -> Bool # (<=) :: DictionarySplat -> DictionarySplat -> Bool # (>) :: DictionarySplat -> DictionarySplat -> Bool # (>=) :: DictionarySplat -> DictionarySplat -> Bool # max :: DictionarySplat -> DictionarySplat -> DictionarySplat # min :: DictionarySplat -> DictionarySplat -> DictionarySplat # | |
| Show DictionarySplat Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> DictionarySplat -> ShowS # show :: DictionarySplat -> String # showList :: [DictionarySplat] -> ShowS # | |
newtype DottedName Source #
Constructors
| DottedName | |
Instances
| Eq DottedName Source # | |
Defined in TreeSitter.Python.AST | |
| Ord DottedName Source # | |
Defined in TreeSitter.Python.AST Methods compare :: DottedName -> DottedName -> Ordering # (<) :: DottedName -> DottedName -> Bool # (<=) :: DottedName -> DottedName -> Bool # (>) :: DottedName -> DottedName -> Bool # (>=) :: DottedName -> DottedName -> Bool # max :: DottedName -> DottedName -> DottedName # min :: DottedName -> DottedName -> DottedName # | |
| Show DottedName Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> DottedName -> ShowS # show :: DottedName -> String # showList :: [DottedName] -> ShowS # | |
newtype ExceptClause Source #
Constructors
| ExceptClause | |
Instances
| Eq ExceptClause Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ExceptClause Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ExceptClause -> ExceptClause -> Ordering # (<) :: ExceptClause -> ExceptClause -> Bool # (<=) :: ExceptClause -> ExceptClause -> Bool # (>) :: ExceptClause -> ExceptClause -> Bool # (>=) :: ExceptClause -> ExceptClause -> Bool # max :: ExceptClause -> ExceptClause -> ExceptClause # min :: ExceptClause -> ExceptClause -> ExceptClause # | |
| Show ExceptClause Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ExceptClause -> ShowS # show :: ExceptClause -> String # showList :: [ExceptClause] -> ShowS # | |
newtype ExecStatement Source #
Constructors
| ExecStatement | |
Instances
| Eq ExecStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ExecStatement -> ExecStatement -> Bool # (/=) :: ExecStatement -> ExecStatement -> Bool # | |
| Ord ExecStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ExecStatement -> ExecStatement -> Ordering # (<) :: ExecStatement -> ExecStatement -> Bool # (<=) :: ExecStatement -> ExecStatement -> Bool # (>) :: ExecStatement -> ExecStatement -> Bool # (>=) :: ExecStatement -> ExecStatement -> Bool # max :: ExecStatement -> ExecStatement -> ExecStatement # min :: ExecStatement -> ExecStatement -> ExecStatement # | |
| Show ExecStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ExecStatement -> ShowS # show :: ExecStatement -> String # showList :: [ExecStatement] -> ShowS # | |
newtype ExpressionList Source #
Constructors
| ExpressionList | |
Instances
| Eq ExpressionList Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ExpressionList -> ExpressionList -> Bool # (/=) :: ExpressionList -> ExpressionList -> Bool # | |
| Ord ExpressionList Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ExpressionList -> ExpressionList -> Ordering # (<) :: ExpressionList -> ExpressionList -> Bool # (<=) :: ExpressionList -> ExpressionList -> Bool # (>) :: ExpressionList -> ExpressionList -> Bool # (>=) :: ExpressionList -> ExpressionList -> Bool # max :: ExpressionList -> ExpressionList -> ExpressionList # min :: ExpressionList -> ExpressionList -> ExpressionList # | |
| Show ExpressionList Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ExpressionList -> ShowS # show :: ExpressionList -> String # showList :: [ExpressionList] -> ShowS # | |
newtype ExpressionStatement Source #
Constructors
| ExpressionStatement | |
Instances
| Eq ExpressionStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ExpressionStatement -> ExpressionStatement -> Bool # (/=) :: ExpressionStatement -> ExpressionStatement -> Bool # | |
| Ord ExpressionStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ExpressionStatement -> ExpressionStatement -> Ordering # (<) :: ExpressionStatement -> ExpressionStatement -> Bool # (<=) :: ExpressionStatement -> ExpressionStatement -> Bool # (>) :: ExpressionStatement -> ExpressionStatement -> Bool # (>=) :: ExpressionStatement -> ExpressionStatement -> Bool # max :: ExpressionStatement -> ExpressionStatement -> ExpressionStatement # min :: ExpressionStatement -> ExpressionStatement -> ExpressionStatement # | |
| Show ExpressionStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ExpressionStatement -> ShowS # show :: ExpressionStatement -> String # showList :: [ExpressionStatement] -> ShowS # | |
newtype FinallyClause Source #
Constructors
| FinallyClause | |
Instances
| Eq FinallyClause Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: FinallyClause -> FinallyClause -> Bool # (/=) :: FinallyClause -> FinallyClause -> Bool # | |
| Ord FinallyClause Source # | |
Defined in TreeSitter.Python.AST Methods compare :: FinallyClause -> FinallyClause -> Ordering # (<) :: FinallyClause -> FinallyClause -> Bool # (<=) :: FinallyClause -> FinallyClause -> Bool # (>) :: FinallyClause -> FinallyClause -> Bool # (>=) :: FinallyClause -> FinallyClause -> Bool # max :: FinallyClause -> FinallyClause -> FinallyClause # min :: FinallyClause -> FinallyClause -> FinallyClause # | |
| Show FinallyClause Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> FinallyClause -> ShowS # show :: FinallyClause -> String # showList :: [FinallyClause] -> ShowS # | |
newtype ForInClause Source #
Constructors
| ForInClause | |
Instances
| Eq ForInClause Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ForInClause Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ForInClause -> ForInClause -> Ordering # (<) :: ForInClause -> ForInClause -> Bool # (<=) :: ForInClause -> ForInClause -> Bool # (>) :: ForInClause -> ForInClause -> Bool # (>=) :: ForInClause -> ForInClause -> Bool # max :: ForInClause -> ForInClause -> ForInClause # min :: ForInClause -> ForInClause -> ForInClause # | |
| Show ForInClause Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ForInClause -> ShowS # show :: ForInClause -> String # showList :: [ForInClause] -> ShowS # | |
newtype FormatExpression Source #
Constructors
| FormatExpression | |
Instances
| Eq FormatExpression Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: FormatExpression -> FormatExpression -> Bool # (/=) :: FormatExpression -> FormatExpression -> Bool # | |
| Ord FormatExpression Source # | |
Defined in TreeSitter.Python.AST Methods compare :: FormatExpression -> FormatExpression -> Ordering # (<) :: FormatExpression -> FormatExpression -> Bool # (<=) :: FormatExpression -> FormatExpression -> Bool # (>) :: FormatExpression -> FormatExpression -> Bool # (>=) :: FormatExpression -> FormatExpression -> Bool # max :: FormatExpression -> FormatExpression -> FormatExpression # min :: FormatExpression -> FormatExpression -> FormatExpression # | |
| Show FormatExpression Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> FormatExpression -> ShowS # show :: FormatExpression -> String # showList :: [FormatExpression] -> ShowS # | |
newtype FormatSpecifier Source #
Constructors
| FormatSpecifier | |
Instances
| Eq FormatSpecifier Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: FormatSpecifier -> FormatSpecifier -> Bool # (/=) :: FormatSpecifier -> FormatSpecifier -> Bool # | |
| Ord FormatSpecifier Source # | |
Defined in TreeSitter.Python.AST Methods compare :: FormatSpecifier -> FormatSpecifier -> Ordering # (<) :: FormatSpecifier -> FormatSpecifier -> Bool # (<=) :: FormatSpecifier -> FormatSpecifier -> Bool # (>) :: FormatSpecifier -> FormatSpecifier -> Bool # (>=) :: FormatSpecifier -> FormatSpecifier -> Bool # max :: FormatSpecifier -> FormatSpecifier -> FormatSpecifier # min :: FormatSpecifier -> FormatSpecifier -> FormatSpecifier # | |
| Show FormatSpecifier Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> FormatSpecifier -> ShowS # show :: FormatSpecifier -> String # showList :: [FormatSpecifier] -> ShowS # | |
newtype GeneratorExpression Source #
Constructors
| GeneratorExpression | |
Instances
| Eq GeneratorExpression Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: GeneratorExpression -> GeneratorExpression -> Bool # (/=) :: GeneratorExpression -> GeneratorExpression -> Bool # | |
| Ord GeneratorExpression Source # | |
Defined in TreeSitter.Python.AST Methods compare :: GeneratorExpression -> GeneratorExpression -> Ordering # (<) :: GeneratorExpression -> GeneratorExpression -> Bool # (<=) :: GeneratorExpression -> GeneratorExpression -> Bool # (>) :: GeneratorExpression -> GeneratorExpression -> Bool # (>=) :: GeneratorExpression -> GeneratorExpression -> Bool # max :: GeneratorExpression -> GeneratorExpression -> GeneratorExpression # min :: GeneratorExpression -> GeneratorExpression -> GeneratorExpression # | |
| Show GeneratorExpression Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> GeneratorExpression -> ShowS # show :: GeneratorExpression -> String # showList :: [GeneratorExpression] -> ShowS # | |
newtype GlobalStatement Source #
Constructors
| GlobalStatement | |
Instances
| Eq GlobalStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: GlobalStatement -> GlobalStatement -> Bool # (/=) :: GlobalStatement -> GlobalStatement -> Bool # | |
| Ord GlobalStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: GlobalStatement -> GlobalStatement -> Ordering # (<) :: GlobalStatement -> GlobalStatement -> Bool # (<=) :: GlobalStatement -> GlobalStatement -> Bool # (>) :: GlobalStatement -> GlobalStatement -> Bool # (>=) :: GlobalStatement -> GlobalStatement -> Bool # max :: GlobalStatement -> GlobalStatement -> GlobalStatement # min :: GlobalStatement -> GlobalStatement -> GlobalStatement # | |
| Show GlobalStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> GlobalStatement -> ShowS # show :: GlobalStatement -> String # showList :: [GlobalStatement] -> ShowS # | |
newtype ImportPrefix Source #
Constructors
| ImportPrefix | |
Instances
| Eq ImportPrefix Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ImportPrefix Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ImportPrefix -> ImportPrefix -> Ordering # (<) :: ImportPrefix -> ImportPrefix -> Bool # (<=) :: ImportPrefix -> ImportPrefix -> Bool # (>) :: ImportPrefix -> ImportPrefix -> Bool # (>=) :: ImportPrefix -> ImportPrefix -> Bool # max :: ImportPrefix -> ImportPrefix -> ImportPrefix # min :: ImportPrefix -> ImportPrefix -> ImportPrefix # | |
| Show ImportPrefix Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ImportPrefix -> ShowS # show :: ImportPrefix -> String # showList :: [ImportPrefix] -> ShowS # | |
newtype Interpolation Source #
Constructors
| Interpolation | |
Instances
| Eq Interpolation Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: Interpolation -> Interpolation -> Bool # (/=) :: Interpolation -> Interpolation -> Bool # | |
| Ord Interpolation Source # | |
Defined in TreeSitter.Python.AST Methods compare :: Interpolation -> Interpolation -> Ordering # (<) :: Interpolation -> Interpolation -> Bool # (<=) :: Interpolation -> Interpolation -> Bool # (>) :: Interpolation -> Interpolation -> Bool # (>=) :: Interpolation -> Interpolation -> Bool # max :: Interpolation -> Interpolation -> Interpolation # min :: Interpolation -> Interpolation -> Interpolation # | |
| Show Interpolation Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> Interpolation -> ShowS # show :: Interpolation -> String # showList :: [Interpolation] -> ShowS # | |
newtype KeywordArgument Source #
Constructors
| KeywordArgument | |
Instances
| Eq KeywordArgument Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: KeywordArgument -> KeywordArgument -> Bool # (/=) :: KeywordArgument -> KeywordArgument -> Bool # | |
| Ord KeywordArgument Source # | |
Defined in TreeSitter.Python.AST Methods compare :: KeywordArgument -> KeywordArgument -> Ordering # (<) :: KeywordArgument -> KeywordArgument -> Bool # (<=) :: KeywordArgument -> KeywordArgument -> Bool # (>) :: KeywordArgument -> KeywordArgument -> Bool # (>=) :: KeywordArgument -> KeywordArgument -> Bool # max :: KeywordArgument -> KeywordArgument -> KeywordArgument # min :: KeywordArgument -> KeywordArgument -> KeywordArgument # | |
| Show KeywordArgument Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> KeywordArgument -> ShowS # show :: KeywordArgument -> String # showList :: [KeywordArgument] -> ShowS # | |
newtype KeywordIdentifier Source #
Constructors
| KeywordIdentifier | |
Instances
| Eq KeywordIdentifier Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: KeywordIdentifier -> KeywordIdentifier -> Bool # (/=) :: KeywordIdentifier -> KeywordIdentifier -> Bool # | |
| Ord KeywordIdentifier Source # | |
Defined in TreeSitter.Python.AST Methods compare :: KeywordIdentifier -> KeywordIdentifier -> Ordering # (<) :: KeywordIdentifier -> KeywordIdentifier -> Bool # (<=) :: KeywordIdentifier -> KeywordIdentifier -> Bool # (>) :: KeywordIdentifier -> KeywordIdentifier -> Bool # (>=) :: KeywordIdentifier -> KeywordIdentifier -> Bool # max :: KeywordIdentifier -> KeywordIdentifier -> KeywordIdentifier # min :: KeywordIdentifier -> KeywordIdentifier -> KeywordIdentifier # | |
| Show KeywordIdentifier Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> KeywordIdentifier -> ShowS # show :: KeywordIdentifier -> String # showList :: [KeywordIdentifier] -> ShowS # | |
newtype LambdaParameters Source #
Constructors
| LambdaParameters | |
Instances
| Eq LambdaParameters Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: LambdaParameters -> LambdaParameters -> Bool # (/=) :: LambdaParameters -> LambdaParameters -> Bool # | |
| Ord LambdaParameters Source # | |
Defined in TreeSitter.Python.AST Methods compare :: LambdaParameters -> LambdaParameters -> Ordering # (<) :: LambdaParameters -> LambdaParameters -> Bool # (<=) :: LambdaParameters -> LambdaParameters -> Bool # (>) :: LambdaParameters -> LambdaParameters -> Bool # (>=) :: LambdaParameters -> LambdaParameters -> Bool # max :: LambdaParameters -> LambdaParameters -> LambdaParameters # min :: LambdaParameters -> LambdaParameters -> LambdaParameters # | |
| Show LambdaParameters Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> LambdaParameters -> ShowS # show :: LambdaParameters -> String # showList :: [LambdaParameters] -> ShowS # | |
newtype ListComprehension Source #
Constructors
| ListComprehension | |
Instances
| Eq ListComprehension Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ListComprehension -> ListComprehension -> Bool # (/=) :: ListComprehension -> ListComprehension -> Bool # | |
| Ord ListComprehension Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ListComprehension -> ListComprehension -> Ordering # (<) :: ListComprehension -> ListComprehension -> Bool # (<=) :: ListComprehension -> ListComprehension -> Bool # (>) :: ListComprehension -> ListComprehension -> Bool # (>=) :: ListComprehension -> ListComprehension -> Bool # max :: ListComprehension -> ListComprehension -> ListComprehension # min :: ListComprehension -> ListComprehension -> ListComprehension # | |
| Show ListComprehension Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ListComprehension -> ShowS # show :: ListComprehension -> String # showList :: [ListComprehension] -> ShowS # | |
Instances
| Eq ListSplat Source # | |
| Ord ListSplat Source # | |
| Show ListSplat Source # | |
newtype NamedExpression Source #
Constructors
| NamedExpression | |
Instances
| Eq NamedExpression Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: NamedExpression -> NamedExpression -> Bool # (/=) :: NamedExpression -> NamedExpression -> Bool # | |
| Ord NamedExpression Source # | |
Defined in TreeSitter.Python.AST Methods compare :: NamedExpression -> NamedExpression -> Ordering # (<) :: NamedExpression -> NamedExpression -> Bool # (<=) :: NamedExpression -> NamedExpression -> Bool # (>) :: NamedExpression -> NamedExpression -> Bool # (>=) :: NamedExpression -> NamedExpression -> Bool # max :: NamedExpression -> NamedExpression -> NamedExpression # min :: NamedExpression -> NamedExpression -> NamedExpression # | |
| Show NamedExpression Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> NamedExpression -> ShowS # show :: NamedExpression -> String # showList :: [NamedExpression] -> ShowS # | |
newtype NonlocalStatement Source #
Constructors
| NonlocalStatement | |
Instances
| Eq NonlocalStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: NonlocalStatement -> NonlocalStatement -> Bool # (/=) :: NonlocalStatement -> NonlocalStatement -> Bool # | |
| Ord NonlocalStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: NonlocalStatement -> NonlocalStatement -> Ordering # (<) :: NonlocalStatement -> NonlocalStatement -> Bool # (<=) :: NonlocalStatement -> NonlocalStatement -> Bool # (>) :: NonlocalStatement -> NonlocalStatement -> Bool # (>=) :: NonlocalStatement -> NonlocalStatement -> Bool # max :: NonlocalStatement -> NonlocalStatement -> NonlocalStatement # min :: NonlocalStatement -> NonlocalStatement -> NonlocalStatement # | |
| Show NonlocalStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> NonlocalStatement -> ShowS # show :: NonlocalStatement -> String # showList :: [NonlocalStatement] -> ShowS # | |
newtype Parameters Source #
Constructors
| Parameters | |
Instances
| Eq Parameters Source # | |
Defined in TreeSitter.Python.AST | |
| Ord Parameters Source # | |
Defined in TreeSitter.Python.AST Methods compare :: Parameters -> Parameters -> Ordering # (<) :: Parameters -> Parameters -> Bool # (<=) :: Parameters -> Parameters -> Bool # (>) :: Parameters -> Parameters -> Bool # (>=) :: Parameters -> Parameters -> Bool # max :: Parameters -> Parameters -> Parameters # min :: Parameters -> Parameters -> Parameters # | |
| Show Parameters Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> Parameters -> ShowS # show :: Parameters -> String # showList :: [Parameters] -> ShowS # | |
newtype ParenthesizedExpression Source #
Constructors
| ParenthesizedExpression | |
Instances
newtype PassStatement Source #
Constructors
| PassStatement | |
Instances
| Eq PassStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: PassStatement -> PassStatement -> Bool # (/=) :: PassStatement -> PassStatement -> Bool # | |
| Ord PassStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: PassStatement -> PassStatement -> Ordering # (<) :: PassStatement -> PassStatement -> Bool # (<=) :: PassStatement -> PassStatement -> Bool # (>) :: PassStatement -> PassStatement -> Bool # (>=) :: PassStatement -> PassStatement -> Bool # max :: PassStatement -> PassStatement -> PassStatement # min :: PassStatement -> PassStatement -> PassStatement # | |
| Show PassStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> PassStatement -> ShowS # show :: PassStatement -> String # showList :: [PassStatement] -> ShowS # | |
newtype RaiseStatement Source #
Constructors
| RaiseStatement | |
Instances
| Eq RaiseStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: RaiseStatement -> RaiseStatement -> Bool # (/=) :: RaiseStatement -> RaiseStatement -> Bool # | |
| Ord RaiseStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: RaiseStatement -> RaiseStatement -> Ordering # (<) :: RaiseStatement -> RaiseStatement -> Bool # (<=) :: RaiseStatement -> RaiseStatement -> Bool # (>) :: RaiseStatement -> RaiseStatement -> Bool # (>=) :: RaiseStatement -> RaiseStatement -> Bool # max :: RaiseStatement -> RaiseStatement -> RaiseStatement # min :: RaiseStatement -> RaiseStatement -> RaiseStatement # | |
| Show RaiseStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> RaiseStatement -> ShowS # show :: RaiseStatement -> String # showList :: [RaiseStatement] -> ShowS # | |
newtype RelativeImport Source #
Constructors
| RelativeImport | |
Instances
| Eq RelativeImport Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: RelativeImport -> RelativeImport -> Bool # (/=) :: RelativeImport -> RelativeImport -> Bool # | |
| Ord RelativeImport Source # | |
Defined in TreeSitter.Python.AST Methods compare :: RelativeImport -> RelativeImport -> Ordering # (<) :: RelativeImport -> RelativeImport -> Bool # (<=) :: RelativeImport -> RelativeImport -> Bool # (>) :: RelativeImport -> RelativeImport -> Bool # (>=) :: RelativeImport -> RelativeImport -> Bool # max :: RelativeImport -> RelativeImport -> RelativeImport # min :: RelativeImport -> RelativeImport -> RelativeImport # | |
| Show RelativeImport Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> RelativeImport -> ShowS # show :: RelativeImport -> String # showList :: [RelativeImport] -> ShowS # | |
newtype ReturnStatement Source #
Constructors
| ReturnStatement | |
Instances
| Eq ReturnStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ReturnStatement -> ReturnStatement -> Bool # (/=) :: ReturnStatement -> ReturnStatement -> Bool # | |
| Ord ReturnStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ReturnStatement -> ReturnStatement -> Ordering # (<) :: ReturnStatement -> ReturnStatement -> Bool # (<=) :: ReturnStatement -> ReturnStatement -> Bool # (>) :: ReturnStatement -> ReturnStatement -> Bool # (>=) :: ReturnStatement -> ReturnStatement -> Bool # max :: ReturnStatement -> ReturnStatement -> ReturnStatement # min :: ReturnStatement -> ReturnStatement -> ReturnStatement # | |
| Show ReturnStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ReturnStatement -> ShowS # show :: ReturnStatement -> String # showList :: [ReturnStatement] -> ShowS # | |
newtype SetComprehension Source #
Constructors
| SetComprehension | |
Instances
| Eq SetComprehension Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: SetComprehension -> SetComprehension -> Bool # (/=) :: SetComprehension -> SetComprehension -> Bool # | |
| Ord SetComprehension Source # | |
Defined in TreeSitter.Python.AST Methods compare :: SetComprehension -> SetComprehension -> Ordering # (<) :: SetComprehension -> SetComprehension -> Bool # (<=) :: SetComprehension -> SetComprehension -> Bool # (>) :: SetComprehension -> SetComprehension -> Bool # (>=) :: SetComprehension -> SetComprehension -> Bool # max :: SetComprehension -> SetComprehension -> SetComprehension # min :: SetComprehension -> SetComprehension -> SetComprehension # | |
| Show SetComprehension Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> SetComprehension -> ShowS # show :: SetComprehension -> String # showList :: [SetComprehension] -> ShowS # | |
Instances
| Eq Subscript Source # | |
| Ord Subscript Source # | |
| Show Subscript Source # | |
newtype TypedDefaultParameter Source #
Constructors
| TypedDefaultParameter | |
Instances
| Eq TypedDefaultParameter Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: TypedDefaultParameter -> TypedDefaultParameter -> Bool # (/=) :: TypedDefaultParameter -> TypedDefaultParameter -> Bool # | |
| Ord TypedDefaultParameter Source # | |
Defined in TreeSitter.Python.AST Methods compare :: TypedDefaultParameter -> TypedDefaultParameter -> Ordering # (<) :: TypedDefaultParameter -> TypedDefaultParameter -> Bool # (<=) :: TypedDefaultParameter -> TypedDefaultParameter -> Bool # (>) :: TypedDefaultParameter -> TypedDefaultParameter -> Bool # (>=) :: TypedDefaultParameter -> TypedDefaultParameter -> Bool # max :: TypedDefaultParameter -> TypedDefaultParameter -> TypedDefaultParameter # min :: TypedDefaultParameter -> TypedDefaultParameter -> TypedDefaultParameter # | |
| Show TypedDefaultParameter Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> TypedDefaultParameter -> ShowS # show :: TypedDefaultParameter -> String # showList :: [TypedDefaultParameter] -> ShowS # | |
newtype TypedParameter Source #
Constructors
| TypedParameter | |
Instances
| Eq TypedParameter Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: TypedParameter -> TypedParameter -> Bool # (/=) :: TypedParameter -> TypedParameter -> Bool # | |
| Ord TypedParameter Source # | |
Defined in TreeSitter.Python.AST Methods compare :: TypedParameter -> TypedParameter -> Ordering # (<) :: TypedParameter -> TypedParameter -> Bool # (<=) :: TypedParameter -> TypedParameter -> Bool # (>) :: TypedParameter -> TypedParameter -> Bool # (>=) :: TypedParameter -> TypedParameter -> Bool # max :: TypedParameter -> TypedParameter -> TypedParameter # min :: TypedParameter -> TypedParameter -> TypedParameter # | |
| Show TypedParameter Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> TypedParameter -> ShowS # show :: TypedParameter -> String # showList :: [TypedParameter] -> ShowS # | |
Instances
| Eq Variables Source # | |
| Ord Variables Source # | |
| Show Variables Source # | |
newtype WildcardImport Source #
Constructors
| WildcardImport | |
Instances
| Eq WildcardImport Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: WildcardImport -> WildcardImport -> Bool # (/=) :: WildcardImport -> WildcardImport -> Bool # | |
| Ord WildcardImport Source # | |
Defined in TreeSitter.Python.AST Methods compare :: WildcardImport -> WildcardImport -> Ordering # (<) :: WildcardImport -> WildcardImport -> Bool # (<=) :: WildcardImport -> WildcardImport -> Bool # (>) :: WildcardImport -> WildcardImport -> Bool # (>=) :: WildcardImport -> WildcardImport -> Bool # max :: WildcardImport -> WildcardImport -> WildcardImport # min :: WildcardImport -> WildcardImport -> WildcardImport # | |
| Show WildcardImport Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> WildcardImport -> ShowS # show :: WildcardImport -> String # showList :: [WildcardImport] -> ShowS # | |
newtype WithStatement Source #
Constructors
| WithStatement | |
Instances
| Eq WithStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: WithStatement -> WithStatement -> Bool # (/=) :: WithStatement -> WithStatement -> Bool # | |
| Ord WithStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: WithStatement -> WithStatement -> Ordering # (<) :: WithStatement -> WithStatement -> Bool # (<=) :: WithStatement -> WithStatement -> Bool # (>) :: WithStatement -> WithStatement -> Bool # (>=) :: WithStatement -> WithStatement -> Bool # max :: WithStatement -> WithStatement -> WithStatement # min :: WithStatement -> WithStatement -> WithStatement # | |
| Show WithStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> WithStatement -> ShowS # show :: WithStatement -> String # showList :: [WithStatement] -> ShowS # | |
data Assignment Source #
Constructors
| Assignment | |
Fields
| |
Instances
| Eq Assignment Source # | |
Defined in TreeSitter.Python.AST | |
| Ord Assignment Source # | |
Defined in TreeSitter.Python.AST Methods compare :: Assignment -> Assignment -> Ordering # (<) :: Assignment -> Assignment -> Bool # (<=) :: Assignment -> Assignment -> Bool # (>) :: Assignment -> Assignment -> Bool # (>=) :: Assignment -> Assignment -> Bool # max :: Assignment -> Assignment -> Assignment # min :: Assignment -> Assignment -> Assignment # | |
| Show Assignment Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> Assignment -> ShowS # show :: Assignment -> String # showList :: [Assignment] -> ShowS # | |
data AugmentedAssignment Source #
Constructors
| AugmentedAssignment | |
Fields | |
Instances
| Eq AugmentedAssignment Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AugmentedAssignment -> AugmentedAssignment -> Bool # (/=) :: AugmentedAssignment -> AugmentedAssignment -> Bool # | |
| Ord AugmentedAssignment Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AugmentedAssignment -> AugmentedAssignment -> Ordering # (<) :: AugmentedAssignment -> AugmentedAssignment -> Bool # (<=) :: AugmentedAssignment -> AugmentedAssignment -> Bool # (>) :: AugmentedAssignment -> AugmentedAssignment -> Bool # (>=) :: AugmentedAssignment -> AugmentedAssignment -> Bool # max :: AugmentedAssignment -> AugmentedAssignment -> AugmentedAssignment # min :: AugmentedAssignment -> AugmentedAssignment -> AugmentedAssignment # | |
| Show AugmentedAssignment Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AugmentedAssignment -> ShowS # show :: AugmentedAssignment -> String # showList :: [AugmentedAssignment] -> ShowS # | |
data AnonymousImport Source #
Constructors
| AnonymousImport |
Instances
| Eq AnonymousImport Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousImport -> AnonymousImport -> Bool # (/=) :: AnonymousImport -> AnonymousImport -> Bool # | |
| Ord AnonymousImport Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousImport -> AnonymousImport -> Ordering # (<) :: AnonymousImport -> AnonymousImport -> Bool # (<=) :: AnonymousImport -> AnonymousImport -> Bool # (>) :: AnonymousImport -> AnonymousImport -> Bool # (>=) :: AnonymousImport -> AnonymousImport -> Bool # max :: AnonymousImport -> AnonymousImport -> AnonymousImport # min :: AnonymousImport -> AnonymousImport -> AnonymousImport # | |
| Show AnonymousImport Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousImport -> ShowS # show :: AnonymousImport -> String # showList :: [AnonymousImport] -> ShowS # | |
data AnonymousDot Source #
Constructors
| AnonymousDot |
Instances
| Eq AnonymousDot Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousDot Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousDot -> AnonymousDot -> Ordering # (<) :: AnonymousDot -> AnonymousDot -> Bool # (<=) :: AnonymousDot -> AnonymousDot -> Bool # (>) :: AnonymousDot -> AnonymousDot -> Bool # (>=) :: AnonymousDot -> AnonymousDot -> Bool # max :: AnonymousDot -> AnonymousDot -> AnonymousDot # min :: AnonymousDot -> AnonymousDot -> AnonymousDot # | |
| Show AnonymousDot Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousDot -> ShowS # show :: AnonymousDot -> String # showList :: [AnonymousDot] -> ShowS # | |
data AnonymousFrom Source #
Constructors
| AnonymousFrom |
Instances
| Eq AnonymousFrom Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousFrom -> AnonymousFrom -> Bool # (/=) :: AnonymousFrom -> AnonymousFrom -> Bool # | |
| Ord AnonymousFrom Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousFrom -> AnonymousFrom -> Ordering # (<) :: AnonymousFrom -> AnonymousFrom -> Bool # (<=) :: AnonymousFrom -> AnonymousFrom -> Bool # (>) :: AnonymousFrom -> AnonymousFrom -> Bool # (>=) :: AnonymousFrom -> AnonymousFrom -> Bool # max :: AnonymousFrom -> AnonymousFrom -> AnonymousFrom # min :: AnonymousFrom -> AnonymousFrom -> AnonymousFrom # | |
| Show AnonymousFrom Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousFrom -> ShowS # show :: AnonymousFrom -> String # showList :: [AnonymousFrom] -> ShowS # | |
data AnonymousFuture Source #
Constructors
| AnonymousFuture |
Instances
| Eq AnonymousFuture Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousFuture -> AnonymousFuture -> Bool # (/=) :: AnonymousFuture -> AnonymousFuture -> Bool # | |
| Ord AnonymousFuture Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousFuture -> AnonymousFuture -> Ordering # (<) :: AnonymousFuture -> AnonymousFuture -> Bool # (<=) :: AnonymousFuture -> AnonymousFuture -> Bool # (>) :: AnonymousFuture -> AnonymousFuture -> Bool # (>=) :: AnonymousFuture -> AnonymousFuture -> Bool # max :: AnonymousFuture -> AnonymousFuture -> AnonymousFuture # min :: AnonymousFuture -> AnonymousFuture -> AnonymousFuture # | |
| Show AnonymousFuture Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousFuture -> ShowS # show :: AnonymousFuture -> String # showList :: [AnonymousFuture] -> ShowS # | |
data AnonymousLParen Source #
Constructors
| AnonymousLParen |
Instances
| Eq AnonymousLParen Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLParen -> AnonymousLParen -> Bool # (/=) :: AnonymousLParen -> AnonymousLParen -> Bool # | |
| Ord AnonymousLParen Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLParen -> AnonymousLParen -> Ordering # (<) :: AnonymousLParen -> AnonymousLParen -> Bool # (<=) :: AnonymousLParen -> AnonymousLParen -> Bool # (>) :: AnonymousLParen -> AnonymousLParen -> Bool # (>=) :: AnonymousLParen -> AnonymousLParen -> Bool # max :: AnonymousLParen -> AnonymousLParen -> AnonymousLParen # min :: AnonymousLParen -> AnonymousLParen -> AnonymousLParen # | |
| Show AnonymousLParen Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLParen -> ShowS # show :: AnonymousLParen -> String # showList :: [AnonymousLParen] -> ShowS # | |
data AnonymousRParen Source #
Constructors
| AnonymousRParen |
Instances
| Eq AnonymousRParen Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRParen -> AnonymousRParen -> Bool # (/=) :: AnonymousRParen -> AnonymousRParen -> Bool # | |
| Ord AnonymousRParen Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRParen -> AnonymousRParen -> Ordering # (<) :: AnonymousRParen -> AnonymousRParen -> Bool # (<=) :: AnonymousRParen -> AnonymousRParen -> Bool # (>) :: AnonymousRParen -> AnonymousRParen -> Bool # (>=) :: AnonymousRParen -> AnonymousRParen -> Bool # max :: AnonymousRParen -> AnonymousRParen -> AnonymousRParen # min :: AnonymousRParen -> AnonymousRParen -> AnonymousRParen # | |
| Show AnonymousRParen Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRParen -> ShowS # show :: AnonymousRParen -> String # showList :: [AnonymousRParen] -> ShowS # | |
data AnonymousComma Source #
Constructors
| AnonymousComma |
Instances
| Eq AnonymousComma Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousComma -> AnonymousComma -> Bool # (/=) :: AnonymousComma -> AnonymousComma -> Bool # | |
| Ord AnonymousComma Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousComma -> AnonymousComma -> Ordering # (<) :: AnonymousComma -> AnonymousComma -> Bool # (<=) :: AnonymousComma -> AnonymousComma -> Bool # (>) :: AnonymousComma -> AnonymousComma -> Bool # (>=) :: AnonymousComma -> AnonymousComma -> Bool # max :: AnonymousComma -> AnonymousComma -> AnonymousComma # min :: AnonymousComma -> AnonymousComma -> AnonymousComma # | |
| Show AnonymousComma Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousComma -> ShowS # show :: AnonymousComma -> String # showList :: [AnonymousComma] -> ShowS # | |
data AnonymousAs Source #
Constructors
| AnonymousAs |
Instances
| Eq AnonymousAs Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousAs Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAs -> AnonymousAs -> Ordering # (<) :: AnonymousAs -> AnonymousAs -> Bool # (<=) :: AnonymousAs -> AnonymousAs -> Bool # (>) :: AnonymousAs -> AnonymousAs -> Bool # (>=) :: AnonymousAs -> AnonymousAs -> Bool # max :: AnonymousAs -> AnonymousAs -> AnonymousAs # min :: AnonymousAs -> AnonymousAs -> AnonymousAs # | |
| Show AnonymousAs Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAs -> ShowS # show :: AnonymousAs -> String # showList :: [AnonymousAs] -> ShowS # | |
data AnonymousStar Source #
Constructors
| AnonymousStar |
Instances
| Eq AnonymousStar Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousStar -> AnonymousStar -> Bool # (/=) :: AnonymousStar -> AnonymousStar -> Bool # | |
| Ord AnonymousStar Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousStar -> AnonymousStar -> Ordering # (<) :: AnonymousStar -> AnonymousStar -> Bool # (<=) :: AnonymousStar -> AnonymousStar -> Bool # (>) :: AnonymousStar -> AnonymousStar -> Bool # (>=) :: AnonymousStar -> AnonymousStar -> Bool # max :: AnonymousStar -> AnonymousStar -> AnonymousStar # min :: AnonymousStar -> AnonymousStar -> AnonymousStar # | |
| Show AnonymousStar Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousStar -> ShowS # show :: AnonymousStar -> String # showList :: [AnonymousStar] -> ShowS # | |
data AnonymousPrint Source #
Constructors
| AnonymousPrint |
Instances
| Eq AnonymousPrint Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPrint -> AnonymousPrint -> Bool # (/=) :: AnonymousPrint -> AnonymousPrint -> Bool # | |
| Ord AnonymousPrint Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPrint -> AnonymousPrint -> Ordering # (<) :: AnonymousPrint -> AnonymousPrint -> Bool # (<=) :: AnonymousPrint -> AnonymousPrint -> Bool # (>) :: AnonymousPrint -> AnonymousPrint -> Bool # (>=) :: AnonymousPrint -> AnonymousPrint -> Bool # max :: AnonymousPrint -> AnonymousPrint -> AnonymousPrint # min :: AnonymousPrint -> AnonymousPrint -> AnonymousPrint # | |
| Show AnonymousPrint Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPrint -> ShowS # show :: AnonymousPrint -> String # showList :: [AnonymousPrint] -> ShowS # | |
data AnonymousRAngleRAngle Source #
Constructors
| AnonymousRAngleRAngle |
Instances
| Eq AnonymousRAngleRAngle Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Bool # (/=) :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Bool # | |
| Ord AnonymousRAngleRAngle Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Ordering # (<) :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Bool # (<=) :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Bool # (>) :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Bool # (>=) :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> Bool # max :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> AnonymousRAngleRAngle # min :: AnonymousRAngleRAngle -> AnonymousRAngleRAngle -> AnonymousRAngleRAngle # | |
| Show AnonymousRAngleRAngle Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRAngleRAngle -> ShowS # show :: AnonymousRAngleRAngle -> String # showList :: [AnonymousRAngleRAngle] -> ShowS # | |
data AnonymousAssert Source #
Constructors
| AnonymousAssert |
Instances
| Eq AnonymousAssert Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousAssert -> AnonymousAssert -> Bool # (/=) :: AnonymousAssert -> AnonymousAssert -> Bool # | |
| Ord AnonymousAssert Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAssert -> AnonymousAssert -> Ordering # (<) :: AnonymousAssert -> AnonymousAssert -> Bool # (<=) :: AnonymousAssert -> AnonymousAssert -> Bool # (>) :: AnonymousAssert -> AnonymousAssert -> Bool # (>=) :: AnonymousAssert -> AnonymousAssert -> Bool # max :: AnonymousAssert -> AnonymousAssert -> AnonymousAssert # min :: AnonymousAssert -> AnonymousAssert -> AnonymousAssert # | |
| Show AnonymousAssert Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAssert -> ShowS # show :: AnonymousAssert -> String # showList :: [AnonymousAssert] -> ShowS # | |
data AnonymousColonEqual Source #
Constructors
| AnonymousColonEqual |
Instances
| Eq AnonymousColonEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousColonEqual -> AnonymousColonEqual -> Bool # (/=) :: AnonymousColonEqual -> AnonymousColonEqual -> Bool # | |
| Ord AnonymousColonEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousColonEqual -> AnonymousColonEqual -> Ordering # (<) :: AnonymousColonEqual -> AnonymousColonEqual -> Bool # (<=) :: AnonymousColonEqual -> AnonymousColonEqual -> Bool # (>) :: AnonymousColonEqual -> AnonymousColonEqual -> Bool # (>=) :: AnonymousColonEqual -> AnonymousColonEqual -> Bool # max :: AnonymousColonEqual -> AnonymousColonEqual -> AnonymousColonEqual # min :: AnonymousColonEqual -> AnonymousColonEqual -> AnonymousColonEqual # | |
| Show AnonymousColonEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousColonEqual -> ShowS # show :: AnonymousColonEqual -> String # showList :: [AnonymousColonEqual] -> ShowS # | |
data AnonymousReturn Source #
Constructors
| AnonymousReturn |
Instances
| Eq AnonymousReturn Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousReturn -> AnonymousReturn -> Bool # (/=) :: AnonymousReturn -> AnonymousReturn -> Bool # | |
| Ord AnonymousReturn Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousReturn -> AnonymousReturn -> Ordering # (<) :: AnonymousReturn -> AnonymousReturn -> Bool # (<=) :: AnonymousReturn -> AnonymousReturn -> Bool # (>) :: AnonymousReturn -> AnonymousReturn -> Bool # (>=) :: AnonymousReturn -> AnonymousReturn -> Bool # max :: AnonymousReturn -> AnonymousReturn -> AnonymousReturn # min :: AnonymousReturn -> AnonymousReturn -> AnonymousReturn # | |
| Show AnonymousReturn Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousReturn -> ShowS # show :: AnonymousReturn -> String # showList :: [AnonymousReturn] -> ShowS # | |
data AnonymousDel Source #
Constructors
| AnonymousDel |
Instances
| Eq AnonymousDel Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousDel Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousDel -> AnonymousDel -> Ordering # (<) :: AnonymousDel -> AnonymousDel -> Bool # (<=) :: AnonymousDel -> AnonymousDel -> Bool # (>) :: AnonymousDel -> AnonymousDel -> Bool # (>=) :: AnonymousDel -> AnonymousDel -> Bool # max :: AnonymousDel -> AnonymousDel -> AnonymousDel # min :: AnonymousDel -> AnonymousDel -> AnonymousDel # | |
| Show AnonymousDel Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousDel -> ShowS # show :: AnonymousDel -> String # showList :: [AnonymousDel] -> ShowS # | |
data AnonymousRaise Source #
Constructors
| AnonymousRaise |
Instances
| Eq AnonymousRaise Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRaise -> AnonymousRaise -> Bool # (/=) :: AnonymousRaise -> AnonymousRaise -> Bool # | |
| Ord AnonymousRaise Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRaise -> AnonymousRaise -> Ordering # (<) :: AnonymousRaise -> AnonymousRaise -> Bool # (<=) :: AnonymousRaise -> AnonymousRaise -> Bool # (>) :: AnonymousRaise -> AnonymousRaise -> Bool # (>=) :: AnonymousRaise -> AnonymousRaise -> Bool # max :: AnonymousRaise -> AnonymousRaise -> AnonymousRaise # min :: AnonymousRaise -> AnonymousRaise -> AnonymousRaise # | |
| Show AnonymousRaise Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRaise -> ShowS # show :: AnonymousRaise -> String # showList :: [AnonymousRaise] -> ShowS # | |
data AnonymousPass Source #
Constructors
| AnonymousPass |
Instances
| Eq AnonymousPass Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPass -> AnonymousPass -> Bool # (/=) :: AnonymousPass -> AnonymousPass -> Bool # | |
| Ord AnonymousPass Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPass -> AnonymousPass -> Ordering # (<) :: AnonymousPass -> AnonymousPass -> Bool # (<=) :: AnonymousPass -> AnonymousPass -> Bool # (>) :: AnonymousPass -> AnonymousPass -> Bool # (>=) :: AnonymousPass -> AnonymousPass -> Bool # max :: AnonymousPass -> AnonymousPass -> AnonymousPass # min :: AnonymousPass -> AnonymousPass -> AnonymousPass # | |
| Show AnonymousPass Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPass -> ShowS # show :: AnonymousPass -> String # showList :: [AnonymousPass] -> ShowS # | |
data AnonymousBreak Source #
Constructors
| AnonymousBreak |
Instances
| Eq AnonymousBreak Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousBreak -> AnonymousBreak -> Bool # (/=) :: AnonymousBreak -> AnonymousBreak -> Bool # | |
| Ord AnonymousBreak Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousBreak -> AnonymousBreak -> Ordering # (<) :: AnonymousBreak -> AnonymousBreak -> Bool # (<=) :: AnonymousBreak -> AnonymousBreak -> Bool # (>) :: AnonymousBreak -> AnonymousBreak -> Bool # (>=) :: AnonymousBreak -> AnonymousBreak -> Bool # max :: AnonymousBreak -> AnonymousBreak -> AnonymousBreak # min :: AnonymousBreak -> AnonymousBreak -> AnonymousBreak # | |
| Show AnonymousBreak Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousBreak -> ShowS # show :: AnonymousBreak -> String # showList :: [AnonymousBreak] -> ShowS # | |
data AnonymousContinue Source #
Constructors
| AnonymousContinue |
Instances
| Eq AnonymousContinue Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousContinue -> AnonymousContinue -> Bool # (/=) :: AnonymousContinue -> AnonymousContinue -> Bool # | |
| Ord AnonymousContinue Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousContinue -> AnonymousContinue -> Ordering # (<) :: AnonymousContinue -> AnonymousContinue -> Bool # (<=) :: AnonymousContinue -> AnonymousContinue -> Bool # (>) :: AnonymousContinue -> AnonymousContinue -> Bool # (>=) :: AnonymousContinue -> AnonymousContinue -> Bool # max :: AnonymousContinue -> AnonymousContinue -> AnonymousContinue # min :: AnonymousContinue -> AnonymousContinue -> AnonymousContinue # | |
| Show AnonymousContinue Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousContinue -> ShowS # show :: AnonymousContinue -> String # showList :: [AnonymousContinue] -> ShowS # | |
data AnonymousIf Source #
Constructors
| AnonymousIf |
Instances
| Eq AnonymousIf Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousIf Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousIf -> AnonymousIf -> Ordering # (<) :: AnonymousIf -> AnonymousIf -> Bool # (<=) :: AnonymousIf -> AnonymousIf -> Bool # (>) :: AnonymousIf -> AnonymousIf -> Bool # (>=) :: AnonymousIf -> AnonymousIf -> Bool # max :: AnonymousIf -> AnonymousIf -> AnonymousIf # min :: AnonymousIf -> AnonymousIf -> AnonymousIf # | |
| Show AnonymousIf Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousIf -> ShowS # show :: AnonymousIf -> String # showList :: [AnonymousIf] -> ShowS # | |
data AnonymousColon Source #
Constructors
| AnonymousColon |
Instances
| Eq AnonymousColon Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousColon -> AnonymousColon -> Bool # (/=) :: AnonymousColon -> AnonymousColon -> Bool # | |
| Ord AnonymousColon Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousColon -> AnonymousColon -> Ordering # (<) :: AnonymousColon -> AnonymousColon -> Bool # (<=) :: AnonymousColon -> AnonymousColon -> Bool # (>) :: AnonymousColon -> AnonymousColon -> Bool # (>=) :: AnonymousColon -> AnonymousColon -> Bool # max :: AnonymousColon -> AnonymousColon -> AnonymousColon # min :: AnonymousColon -> AnonymousColon -> AnonymousColon # | |
| Show AnonymousColon Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousColon -> ShowS # show :: AnonymousColon -> String # showList :: [AnonymousColon] -> ShowS # | |
data AnonymousElif Source #
Constructors
| AnonymousElif |
Instances
| Eq AnonymousElif Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousElif -> AnonymousElif -> Bool # (/=) :: AnonymousElif -> AnonymousElif -> Bool # | |
| Ord AnonymousElif Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousElif -> AnonymousElif -> Ordering # (<) :: AnonymousElif -> AnonymousElif -> Bool # (<=) :: AnonymousElif -> AnonymousElif -> Bool # (>) :: AnonymousElif -> AnonymousElif -> Bool # (>=) :: AnonymousElif -> AnonymousElif -> Bool # max :: AnonymousElif -> AnonymousElif -> AnonymousElif # min :: AnonymousElif -> AnonymousElif -> AnonymousElif # | |
| Show AnonymousElif Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousElif -> ShowS # show :: AnonymousElif -> String # showList :: [AnonymousElif] -> ShowS # | |
data AnonymousElse Source #
Constructors
| AnonymousElse |
Instances
| Eq AnonymousElse Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousElse -> AnonymousElse -> Bool # (/=) :: AnonymousElse -> AnonymousElse -> Bool # | |
| Ord AnonymousElse Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousElse -> AnonymousElse -> Ordering # (<) :: AnonymousElse -> AnonymousElse -> Bool # (<=) :: AnonymousElse -> AnonymousElse -> Bool # (>) :: AnonymousElse -> AnonymousElse -> Bool # (>=) :: AnonymousElse -> AnonymousElse -> Bool # max :: AnonymousElse -> AnonymousElse -> AnonymousElse # min :: AnonymousElse -> AnonymousElse -> AnonymousElse # | |
| Show AnonymousElse Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousElse -> ShowS # show :: AnonymousElse -> String # showList :: [AnonymousElse] -> ShowS # | |
data AnonymousAsync Source #
Constructors
| AnonymousAsync |
Instances
| Eq AnonymousAsync Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousAsync -> AnonymousAsync -> Bool # (/=) :: AnonymousAsync -> AnonymousAsync -> Bool # | |
| Ord AnonymousAsync Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAsync -> AnonymousAsync -> Ordering # (<) :: AnonymousAsync -> AnonymousAsync -> Bool # (<=) :: AnonymousAsync -> AnonymousAsync -> Bool # (>) :: AnonymousAsync -> AnonymousAsync -> Bool # (>=) :: AnonymousAsync -> AnonymousAsync -> Bool # max :: AnonymousAsync -> AnonymousAsync -> AnonymousAsync # min :: AnonymousAsync -> AnonymousAsync -> AnonymousAsync # | |
| Show AnonymousAsync Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAsync -> ShowS # show :: AnonymousAsync -> String # showList :: [AnonymousAsync] -> ShowS # | |
data AnonymousFor Source #
Constructors
| AnonymousFor |
Instances
| Eq AnonymousFor Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousFor Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousFor -> AnonymousFor -> Ordering # (<) :: AnonymousFor -> AnonymousFor -> Bool # (<=) :: AnonymousFor -> AnonymousFor -> Bool # (>) :: AnonymousFor -> AnonymousFor -> Bool # (>=) :: AnonymousFor -> AnonymousFor -> Bool # max :: AnonymousFor -> AnonymousFor -> AnonymousFor # min :: AnonymousFor -> AnonymousFor -> AnonymousFor # | |
| Show AnonymousFor Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousFor -> ShowS # show :: AnonymousFor -> String # showList :: [AnonymousFor] -> ShowS # | |
data AnonymousIn Source #
Constructors
| AnonymousIn |
Instances
| Eq AnonymousIn Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousIn Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousIn -> AnonymousIn -> Ordering # (<) :: AnonymousIn -> AnonymousIn -> Bool # (<=) :: AnonymousIn -> AnonymousIn -> Bool # (>) :: AnonymousIn -> AnonymousIn -> Bool # (>=) :: AnonymousIn -> AnonymousIn -> Bool # max :: AnonymousIn -> AnonymousIn -> AnonymousIn # min :: AnonymousIn -> AnonymousIn -> AnonymousIn # | |
| Show AnonymousIn Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousIn -> ShowS # show :: AnonymousIn -> String # showList :: [AnonymousIn] -> ShowS # | |
data AnonymousWhile Source #
Constructors
| AnonymousWhile |
Instances
| Eq AnonymousWhile Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousWhile -> AnonymousWhile -> Bool # (/=) :: AnonymousWhile -> AnonymousWhile -> Bool # | |
| Ord AnonymousWhile Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousWhile -> AnonymousWhile -> Ordering # (<) :: AnonymousWhile -> AnonymousWhile -> Bool # (<=) :: AnonymousWhile -> AnonymousWhile -> Bool # (>) :: AnonymousWhile -> AnonymousWhile -> Bool # (>=) :: AnonymousWhile -> AnonymousWhile -> Bool # max :: AnonymousWhile -> AnonymousWhile -> AnonymousWhile # min :: AnonymousWhile -> AnonymousWhile -> AnonymousWhile # | |
| Show AnonymousWhile Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousWhile -> ShowS # show :: AnonymousWhile -> String # showList :: [AnonymousWhile] -> ShowS # | |
data AnonymousTry Source #
Constructors
| AnonymousTry |
Instances
| Eq AnonymousTry Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousTry Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousTry -> AnonymousTry -> Ordering # (<) :: AnonymousTry -> AnonymousTry -> Bool # (<=) :: AnonymousTry -> AnonymousTry -> Bool # (>) :: AnonymousTry -> AnonymousTry -> Bool # (>=) :: AnonymousTry -> AnonymousTry -> Bool # max :: AnonymousTry -> AnonymousTry -> AnonymousTry # min :: AnonymousTry -> AnonymousTry -> AnonymousTry # | |
| Show AnonymousTry Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousTry -> ShowS # show :: AnonymousTry -> String # showList :: [AnonymousTry] -> ShowS # | |
data AnonymousExcept Source #
Constructors
| AnonymousExcept |
Instances
| Eq AnonymousExcept Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousExcept -> AnonymousExcept -> Bool # (/=) :: AnonymousExcept -> AnonymousExcept -> Bool # | |
| Ord AnonymousExcept Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousExcept -> AnonymousExcept -> Ordering # (<) :: AnonymousExcept -> AnonymousExcept -> Bool # (<=) :: AnonymousExcept -> AnonymousExcept -> Bool # (>) :: AnonymousExcept -> AnonymousExcept -> Bool # (>=) :: AnonymousExcept -> AnonymousExcept -> Bool # max :: AnonymousExcept -> AnonymousExcept -> AnonymousExcept # min :: AnonymousExcept -> AnonymousExcept -> AnonymousExcept # | |
| Show AnonymousExcept Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousExcept -> ShowS # show :: AnonymousExcept -> String # showList :: [AnonymousExcept] -> ShowS # | |
data AnonymousFinally Source #
Constructors
| AnonymousFinally |
Instances
| Eq AnonymousFinally Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousFinally -> AnonymousFinally -> Bool # (/=) :: AnonymousFinally -> AnonymousFinally -> Bool # | |
| Ord AnonymousFinally Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousFinally -> AnonymousFinally -> Ordering # (<) :: AnonymousFinally -> AnonymousFinally -> Bool # (<=) :: AnonymousFinally -> AnonymousFinally -> Bool # (>) :: AnonymousFinally -> AnonymousFinally -> Bool # (>=) :: AnonymousFinally -> AnonymousFinally -> Bool # max :: AnonymousFinally -> AnonymousFinally -> AnonymousFinally # min :: AnonymousFinally -> AnonymousFinally -> AnonymousFinally # | |
| Show AnonymousFinally Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousFinally -> ShowS # show :: AnonymousFinally -> String # showList :: [AnonymousFinally] -> ShowS # | |
data AnonymousWith Source #
Constructors
| AnonymousWith |
Instances
| Eq AnonymousWith Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousWith -> AnonymousWith -> Bool # (/=) :: AnonymousWith -> AnonymousWith -> Bool # | |
| Ord AnonymousWith Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousWith -> AnonymousWith -> Ordering # (<) :: AnonymousWith -> AnonymousWith -> Bool # (<=) :: AnonymousWith -> AnonymousWith -> Bool # (>) :: AnonymousWith -> AnonymousWith -> Bool # (>=) :: AnonymousWith -> AnonymousWith -> Bool # max :: AnonymousWith -> AnonymousWith -> AnonymousWith # min :: AnonymousWith -> AnonymousWith -> AnonymousWith # | |
| Show AnonymousWith Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousWith -> ShowS # show :: AnonymousWith -> String # showList :: [AnonymousWith] -> ShowS # | |
data AnonymousDef Source #
Constructors
| AnonymousDef |
Instances
| Eq AnonymousDef Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousDef Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousDef -> AnonymousDef -> Ordering # (<) :: AnonymousDef -> AnonymousDef -> Bool # (<=) :: AnonymousDef -> AnonymousDef -> Bool # (>) :: AnonymousDef -> AnonymousDef -> Bool # (>=) :: AnonymousDef -> AnonymousDef -> Bool # max :: AnonymousDef -> AnonymousDef -> AnonymousDef # min :: AnonymousDef -> AnonymousDef -> AnonymousDef # | |
| Show AnonymousDef Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousDef -> ShowS # show :: AnonymousDef -> String # showList :: [AnonymousDef] -> ShowS # | |
data AnonymousMinusRAngle Source #
Constructors
| AnonymousMinusRAngle |
Instances
| Eq AnonymousMinusRAngle Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Bool # (/=) :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Bool # | |
| Ord AnonymousMinusRAngle Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Ordering # (<) :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Bool # (<=) :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Bool # (>) :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Bool # (>=) :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> Bool # max :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> AnonymousMinusRAngle # min :: AnonymousMinusRAngle -> AnonymousMinusRAngle -> AnonymousMinusRAngle # | |
| Show AnonymousMinusRAngle Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousMinusRAngle -> ShowS # show :: AnonymousMinusRAngle -> String # showList :: [AnonymousMinusRAngle] -> ShowS # | |
data AnonymousEqual Source #
Constructors
| AnonymousEqual |
Instances
| Eq AnonymousEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousEqual -> AnonymousEqual -> Bool # (/=) :: AnonymousEqual -> AnonymousEqual -> Bool # | |
| Ord AnonymousEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousEqual -> AnonymousEqual -> Ordering # (<) :: AnonymousEqual -> AnonymousEqual -> Bool # (<=) :: AnonymousEqual -> AnonymousEqual -> Bool # (>) :: AnonymousEqual -> AnonymousEqual -> Bool # (>=) :: AnonymousEqual -> AnonymousEqual -> Bool # max :: AnonymousEqual -> AnonymousEqual -> AnonymousEqual # min :: AnonymousEqual -> AnonymousEqual -> AnonymousEqual # | |
| Show AnonymousEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousEqual -> ShowS # show :: AnonymousEqual -> String # showList :: [AnonymousEqual] -> ShowS # | |
data AnonymousGlobal Source #
Constructors
| AnonymousGlobal |
Instances
| Eq AnonymousGlobal Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousGlobal -> AnonymousGlobal -> Bool # (/=) :: AnonymousGlobal -> AnonymousGlobal -> Bool # | |
| Ord AnonymousGlobal Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousGlobal -> AnonymousGlobal -> Ordering # (<) :: AnonymousGlobal -> AnonymousGlobal -> Bool # (<=) :: AnonymousGlobal -> AnonymousGlobal -> Bool # (>) :: AnonymousGlobal -> AnonymousGlobal -> Bool # (>=) :: AnonymousGlobal -> AnonymousGlobal -> Bool # max :: AnonymousGlobal -> AnonymousGlobal -> AnonymousGlobal # min :: AnonymousGlobal -> AnonymousGlobal -> AnonymousGlobal # | |
| Show AnonymousGlobal Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousGlobal -> ShowS # show :: AnonymousGlobal -> String # showList :: [AnonymousGlobal] -> ShowS # | |
data AnonymousNonlocal Source #
Constructors
| AnonymousNonlocal |
Instances
| Eq AnonymousNonlocal Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousNonlocal -> AnonymousNonlocal -> Bool # (/=) :: AnonymousNonlocal -> AnonymousNonlocal -> Bool # | |
| Ord AnonymousNonlocal Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousNonlocal -> AnonymousNonlocal -> Ordering # (<) :: AnonymousNonlocal -> AnonymousNonlocal -> Bool # (<=) :: AnonymousNonlocal -> AnonymousNonlocal -> Bool # (>) :: AnonymousNonlocal -> AnonymousNonlocal -> Bool # (>=) :: AnonymousNonlocal -> AnonymousNonlocal -> Bool # max :: AnonymousNonlocal -> AnonymousNonlocal -> AnonymousNonlocal # min :: AnonymousNonlocal -> AnonymousNonlocal -> AnonymousNonlocal # | |
| Show AnonymousNonlocal Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousNonlocal -> ShowS # show :: AnonymousNonlocal -> String # showList :: [AnonymousNonlocal] -> ShowS # | |
data AnonymousExec Source #
Constructors
| AnonymousExec |
Instances
| Eq AnonymousExec Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousExec -> AnonymousExec -> Bool # (/=) :: AnonymousExec -> AnonymousExec -> Bool # | |
| Ord AnonymousExec Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousExec -> AnonymousExec -> Ordering # (<) :: AnonymousExec -> AnonymousExec -> Bool # (<=) :: AnonymousExec -> AnonymousExec -> Bool # (>) :: AnonymousExec -> AnonymousExec -> Bool # (>=) :: AnonymousExec -> AnonymousExec -> Bool # max :: AnonymousExec -> AnonymousExec -> AnonymousExec # min :: AnonymousExec -> AnonymousExec -> AnonymousExec # | |
| Show AnonymousExec Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousExec -> ShowS # show :: AnonymousExec -> String # showList :: [AnonymousExec] -> ShowS # | |
data AnonymousClass Source #
Constructors
| AnonymousClass |
Instances
| Eq AnonymousClass Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousClass -> AnonymousClass -> Bool # (/=) :: AnonymousClass -> AnonymousClass -> Bool # | |
| Ord AnonymousClass Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousClass -> AnonymousClass -> Ordering # (<) :: AnonymousClass -> AnonymousClass -> Bool # (<=) :: AnonymousClass -> AnonymousClass -> Bool # (>) :: AnonymousClass -> AnonymousClass -> Bool # (>=) :: AnonymousClass -> AnonymousClass -> Bool # max :: AnonymousClass -> AnonymousClass -> AnonymousClass # min :: AnonymousClass -> AnonymousClass -> AnonymousClass # | |
| Show AnonymousClass Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousClass -> ShowS # show :: AnonymousClass -> String # showList :: [AnonymousClass] -> ShowS # | |
data AnonymousAt Source #
Constructors
| AnonymousAt |
Instances
| Eq AnonymousAt Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousAt Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAt -> AnonymousAt -> Ordering # (<) :: AnonymousAt -> AnonymousAt -> Bool # (<=) :: AnonymousAt -> AnonymousAt -> Bool # (>) :: AnonymousAt -> AnonymousAt -> Bool # (>=) :: AnonymousAt -> AnonymousAt -> Bool # max :: AnonymousAt -> AnonymousAt -> AnonymousAt # min :: AnonymousAt -> AnonymousAt -> AnonymousAt # | |
| Show AnonymousAt Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAt -> ShowS # show :: AnonymousAt -> String # showList :: [AnonymousAt] -> ShowS # | |
data AnonymousNot Source #
Constructors
| AnonymousNot |
Instances
| Eq AnonymousNot Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousNot Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousNot -> AnonymousNot -> Ordering # (<) :: AnonymousNot -> AnonymousNot -> Bool # (<=) :: AnonymousNot -> AnonymousNot -> Bool # (>) :: AnonymousNot -> AnonymousNot -> Bool # (>=) :: AnonymousNot -> AnonymousNot -> Bool # max :: AnonymousNot -> AnonymousNot -> AnonymousNot # min :: AnonymousNot -> AnonymousNot -> AnonymousNot # | |
| Show AnonymousNot Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousNot -> ShowS # show :: AnonymousNot -> String # showList :: [AnonymousNot] -> ShowS # | |
data AnonymousAnd Source #
Constructors
| AnonymousAnd |
Instances
| Eq AnonymousAnd Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousAnd Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAnd -> AnonymousAnd -> Ordering # (<) :: AnonymousAnd -> AnonymousAnd -> Bool # (<=) :: AnonymousAnd -> AnonymousAnd -> Bool # (>) :: AnonymousAnd -> AnonymousAnd -> Bool # (>=) :: AnonymousAnd -> AnonymousAnd -> Bool # max :: AnonymousAnd -> AnonymousAnd -> AnonymousAnd # min :: AnonymousAnd -> AnonymousAnd -> AnonymousAnd # | |
| Show AnonymousAnd Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAnd -> ShowS # show :: AnonymousAnd -> String # showList :: [AnonymousAnd] -> ShowS # | |
data AnonymousOr Source #
Constructors
| AnonymousOr |
Instances
| Eq AnonymousOr Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousOr Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousOr -> AnonymousOr -> Ordering # (<) :: AnonymousOr -> AnonymousOr -> Bool # (<=) :: AnonymousOr -> AnonymousOr -> Bool # (>) :: AnonymousOr -> AnonymousOr -> Bool # (>=) :: AnonymousOr -> AnonymousOr -> Bool # max :: AnonymousOr -> AnonymousOr -> AnonymousOr # min :: AnonymousOr -> AnonymousOr -> AnonymousOr # | |
| Show AnonymousOr Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousOr -> ShowS # show :: AnonymousOr -> String # showList :: [AnonymousOr] -> ShowS # | |
data AnonymousPlus Source #
Constructors
| AnonymousPlus |
Instances
| Eq AnonymousPlus Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPlus -> AnonymousPlus -> Bool # (/=) :: AnonymousPlus -> AnonymousPlus -> Bool # | |
| Ord AnonymousPlus Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPlus -> AnonymousPlus -> Ordering # (<) :: AnonymousPlus -> AnonymousPlus -> Bool # (<=) :: AnonymousPlus -> AnonymousPlus -> Bool # (>) :: AnonymousPlus -> AnonymousPlus -> Bool # (>=) :: AnonymousPlus -> AnonymousPlus -> Bool # max :: AnonymousPlus -> AnonymousPlus -> AnonymousPlus # min :: AnonymousPlus -> AnonymousPlus -> AnonymousPlus # | |
| Show AnonymousPlus Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPlus -> ShowS # show :: AnonymousPlus -> String # showList :: [AnonymousPlus] -> ShowS # | |
data AnonymousMinus Source #
Constructors
| AnonymousMinus |
Instances
| Eq AnonymousMinus Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousMinus -> AnonymousMinus -> Bool # (/=) :: AnonymousMinus -> AnonymousMinus -> Bool # | |
| Ord AnonymousMinus Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousMinus -> AnonymousMinus -> Ordering # (<) :: AnonymousMinus -> AnonymousMinus -> Bool # (<=) :: AnonymousMinus -> AnonymousMinus -> Bool # (>) :: AnonymousMinus -> AnonymousMinus -> Bool # (>=) :: AnonymousMinus -> AnonymousMinus -> Bool # max :: AnonymousMinus -> AnonymousMinus -> AnonymousMinus # min :: AnonymousMinus -> AnonymousMinus -> AnonymousMinus # | |
| Show AnonymousMinus Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousMinus -> ShowS # show :: AnonymousMinus -> String # showList :: [AnonymousMinus] -> ShowS # | |
data AnonymousSlash Source #
Constructors
| AnonymousSlash |
Instances
| Eq AnonymousSlash Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousSlash -> AnonymousSlash -> Bool # (/=) :: AnonymousSlash -> AnonymousSlash -> Bool # | |
| Ord AnonymousSlash Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousSlash -> AnonymousSlash -> Ordering # (<) :: AnonymousSlash -> AnonymousSlash -> Bool # (<=) :: AnonymousSlash -> AnonymousSlash -> Bool # (>) :: AnonymousSlash -> AnonymousSlash -> Bool # (>=) :: AnonymousSlash -> AnonymousSlash -> Bool # max :: AnonymousSlash -> AnonymousSlash -> AnonymousSlash # min :: AnonymousSlash -> AnonymousSlash -> AnonymousSlash # | |
| Show AnonymousSlash Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousSlash -> ShowS # show :: AnonymousSlash -> String # showList :: [AnonymousSlash] -> ShowS # | |
data AnonymousPercent Source #
Constructors
| AnonymousPercent |
Instances
| Eq AnonymousPercent Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPercent -> AnonymousPercent -> Bool # (/=) :: AnonymousPercent -> AnonymousPercent -> Bool # | |
| Ord AnonymousPercent Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPercent -> AnonymousPercent -> Ordering # (<) :: AnonymousPercent -> AnonymousPercent -> Bool # (<=) :: AnonymousPercent -> AnonymousPercent -> Bool # (>) :: AnonymousPercent -> AnonymousPercent -> Bool # (>=) :: AnonymousPercent -> AnonymousPercent -> Bool # max :: AnonymousPercent -> AnonymousPercent -> AnonymousPercent # min :: AnonymousPercent -> AnonymousPercent -> AnonymousPercent # | |
| Show AnonymousPercent Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPercent -> ShowS # show :: AnonymousPercent -> String # showList :: [AnonymousPercent] -> ShowS # | |
data AnonymousSlashSlash Source #
Constructors
| AnonymousSlashSlash |
Instances
| Eq AnonymousSlashSlash Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousSlashSlash -> AnonymousSlashSlash -> Bool # (/=) :: AnonymousSlashSlash -> AnonymousSlashSlash -> Bool # | |
| Ord AnonymousSlashSlash Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousSlashSlash -> AnonymousSlashSlash -> Ordering # (<) :: AnonymousSlashSlash -> AnonymousSlashSlash -> Bool # (<=) :: AnonymousSlashSlash -> AnonymousSlashSlash -> Bool # (>) :: AnonymousSlashSlash -> AnonymousSlashSlash -> Bool # (>=) :: AnonymousSlashSlash -> AnonymousSlashSlash -> Bool # max :: AnonymousSlashSlash -> AnonymousSlashSlash -> AnonymousSlashSlash # min :: AnonymousSlashSlash -> AnonymousSlashSlash -> AnonymousSlashSlash # | |
| Show AnonymousSlashSlash Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousSlashSlash -> ShowS # show :: AnonymousSlashSlash -> String # showList :: [AnonymousSlashSlash] -> ShowS # | |
data AnonymousStarStar Source #
Constructors
| AnonymousStarStar |
Instances
| Eq AnonymousStarStar Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousStarStar -> AnonymousStarStar -> Bool # (/=) :: AnonymousStarStar -> AnonymousStarStar -> Bool # | |
| Ord AnonymousStarStar Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousStarStar -> AnonymousStarStar -> Ordering # (<) :: AnonymousStarStar -> AnonymousStarStar -> Bool # (<=) :: AnonymousStarStar -> AnonymousStarStar -> Bool # (>) :: AnonymousStarStar -> AnonymousStarStar -> Bool # (>=) :: AnonymousStarStar -> AnonymousStarStar -> Bool # max :: AnonymousStarStar -> AnonymousStarStar -> AnonymousStarStar # min :: AnonymousStarStar -> AnonymousStarStar -> AnonymousStarStar # | |
| Show AnonymousStarStar Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousStarStar -> ShowS # show :: AnonymousStarStar -> String # showList :: [AnonymousStarStar] -> ShowS # | |
data AnonymousPipe Source #
Constructors
| AnonymousPipe |
Instances
| Eq AnonymousPipe Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPipe -> AnonymousPipe -> Bool # (/=) :: AnonymousPipe -> AnonymousPipe -> Bool # | |
| Ord AnonymousPipe Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPipe -> AnonymousPipe -> Ordering # (<) :: AnonymousPipe -> AnonymousPipe -> Bool # (<=) :: AnonymousPipe -> AnonymousPipe -> Bool # (>) :: AnonymousPipe -> AnonymousPipe -> Bool # (>=) :: AnonymousPipe -> AnonymousPipe -> Bool # max :: AnonymousPipe -> AnonymousPipe -> AnonymousPipe # min :: AnonymousPipe -> AnonymousPipe -> AnonymousPipe # | |
| Show AnonymousPipe Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPipe -> ShowS # show :: AnonymousPipe -> String # showList :: [AnonymousPipe] -> ShowS # | |
data AnonymousAmpersand Source #
Constructors
| AnonymousAmpersand |
Instances
| Eq AnonymousAmpersand Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousAmpersand -> AnonymousAmpersand -> Bool # (/=) :: AnonymousAmpersand -> AnonymousAmpersand -> Bool # | |
| Ord AnonymousAmpersand Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAmpersand -> AnonymousAmpersand -> Ordering # (<) :: AnonymousAmpersand -> AnonymousAmpersand -> Bool # (<=) :: AnonymousAmpersand -> AnonymousAmpersand -> Bool # (>) :: AnonymousAmpersand -> AnonymousAmpersand -> Bool # (>=) :: AnonymousAmpersand -> AnonymousAmpersand -> Bool # max :: AnonymousAmpersand -> AnonymousAmpersand -> AnonymousAmpersand # min :: AnonymousAmpersand -> AnonymousAmpersand -> AnonymousAmpersand # | |
| Show AnonymousAmpersand Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAmpersand -> ShowS # show :: AnonymousAmpersand -> String # showList :: [AnonymousAmpersand] -> ShowS # | |
data AnonymousCaret Source #
Constructors
| AnonymousCaret |
Instances
| Eq AnonymousCaret Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousCaret -> AnonymousCaret -> Bool # (/=) :: AnonymousCaret -> AnonymousCaret -> Bool # | |
| Ord AnonymousCaret Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousCaret -> AnonymousCaret -> Ordering # (<) :: AnonymousCaret -> AnonymousCaret -> Bool # (<=) :: AnonymousCaret -> AnonymousCaret -> Bool # (>) :: AnonymousCaret -> AnonymousCaret -> Bool # (>=) :: AnonymousCaret -> AnonymousCaret -> Bool # max :: AnonymousCaret -> AnonymousCaret -> AnonymousCaret # min :: AnonymousCaret -> AnonymousCaret -> AnonymousCaret # | |
| Show AnonymousCaret Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousCaret -> ShowS # show :: AnonymousCaret -> String # showList :: [AnonymousCaret] -> ShowS # | |
data AnonymousLAngleLAngle Source #
Constructors
| AnonymousLAngleLAngle |
Instances
| Eq AnonymousLAngleLAngle Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Bool # (/=) :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Bool # | |
| Ord AnonymousLAngleLAngle Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Ordering # (<) :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Bool # (<=) :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Bool # (>) :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Bool # (>=) :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> Bool # max :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> AnonymousLAngleLAngle # min :: AnonymousLAngleLAngle -> AnonymousLAngleLAngle -> AnonymousLAngleLAngle # | |
| Show AnonymousLAngleLAngle Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLAngleLAngle -> ShowS # show :: AnonymousLAngleLAngle -> String # showList :: [AnonymousLAngleLAngle] -> ShowS # | |
data AnonymousTilde Source #
Constructors
| AnonymousTilde |
Instances
| Eq AnonymousTilde Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousTilde -> AnonymousTilde -> Bool # (/=) :: AnonymousTilde -> AnonymousTilde -> Bool # | |
| Ord AnonymousTilde Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousTilde -> AnonymousTilde -> Ordering # (<) :: AnonymousTilde -> AnonymousTilde -> Bool # (<=) :: AnonymousTilde -> AnonymousTilde -> Bool # (>) :: AnonymousTilde -> AnonymousTilde -> Bool # (>=) :: AnonymousTilde -> AnonymousTilde -> Bool # max :: AnonymousTilde -> AnonymousTilde -> AnonymousTilde # min :: AnonymousTilde -> AnonymousTilde -> AnonymousTilde # | |
| Show AnonymousTilde Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousTilde -> ShowS # show :: AnonymousTilde -> String # showList :: [AnonymousTilde] -> ShowS # | |
data AnonymousLAngle Source #
Constructors
| AnonymousLAngle |
Instances
| Eq AnonymousLAngle Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLAngle -> AnonymousLAngle -> Bool # (/=) :: AnonymousLAngle -> AnonymousLAngle -> Bool # | |
| Ord AnonymousLAngle Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLAngle -> AnonymousLAngle -> Ordering # (<) :: AnonymousLAngle -> AnonymousLAngle -> Bool # (<=) :: AnonymousLAngle -> AnonymousLAngle -> Bool # (>) :: AnonymousLAngle -> AnonymousLAngle -> Bool # (>=) :: AnonymousLAngle -> AnonymousLAngle -> Bool # max :: AnonymousLAngle -> AnonymousLAngle -> AnonymousLAngle # min :: AnonymousLAngle -> AnonymousLAngle -> AnonymousLAngle # | |
| Show AnonymousLAngle Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLAngle -> ShowS # show :: AnonymousLAngle -> String # showList :: [AnonymousLAngle] -> ShowS # | |
data AnonymousLAngleEqual Source #
Constructors
| AnonymousLAngleEqual |
Instances
| Eq AnonymousLAngleEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Bool # (/=) :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Bool # | |
| Ord AnonymousLAngleEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Ordering # (<) :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Bool # (<=) :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Bool # (>) :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Bool # (>=) :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> Bool # max :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> AnonymousLAngleEqual # min :: AnonymousLAngleEqual -> AnonymousLAngleEqual -> AnonymousLAngleEqual # | |
| Show AnonymousLAngleEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLAngleEqual -> ShowS # show :: AnonymousLAngleEqual -> String # showList :: [AnonymousLAngleEqual] -> ShowS # | |
data AnonymousEqualEqual Source #
Constructors
| AnonymousEqualEqual |
Instances
| Eq AnonymousEqualEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousEqualEqual -> AnonymousEqualEqual -> Bool # (/=) :: AnonymousEqualEqual -> AnonymousEqualEqual -> Bool # | |
| Ord AnonymousEqualEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousEqualEqual -> AnonymousEqualEqual -> Ordering # (<) :: AnonymousEqualEqual -> AnonymousEqualEqual -> Bool # (<=) :: AnonymousEqualEqual -> AnonymousEqualEqual -> Bool # (>) :: AnonymousEqualEqual -> AnonymousEqualEqual -> Bool # (>=) :: AnonymousEqualEqual -> AnonymousEqualEqual -> Bool # max :: AnonymousEqualEqual -> AnonymousEqualEqual -> AnonymousEqualEqual # min :: AnonymousEqualEqual -> AnonymousEqualEqual -> AnonymousEqualEqual # | |
| Show AnonymousEqualEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousEqualEqual -> ShowS # show :: AnonymousEqualEqual -> String # showList :: [AnonymousEqualEqual] -> ShowS # | |
data AnonymousBangEqual Source #
Constructors
| AnonymousBangEqual |
Instances
| Eq AnonymousBangEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousBangEqual -> AnonymousBangEqual -> Bool # (/=) :: AnonymousBangEqual -> AnonymousBangEqual -> Bool # | |
| Ord AnonymousBangEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousBangEqual -> AnonymousBangEqual -> Ordering # (<) :: AnonymousBangEqual -> AnonymousBangEqual -> Bool # (<=) :: AnonymousBangEqual -> AnonymousBangEqual -> Bool # (>) :: AnonymousBangEqual -> AnonymousBangEqual -> Bool # (>=) :: AnonymousBangEqual -> AnonymousBangEqual -> Bool # max :: AnonymousBangEqual -> AnonymousBangEqual -> AnonymousBangEqual # min :: AnonymousBangEqual -> AnonymousBangEqual -> AnonymousBangEqual # | |
| Show AnonymousBangEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousBangEqual -> ShowS # show :: AnonymousBangEqual -> String # showList :: [AnonymousBangEqual] -> ShowS # | |
data AnonymousRAngleEqual Source #
Constructors
| AnonymousRAngleEqual |
Instances
| Eq AnonymousRAngleEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Bool # (/=) :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Bool # | |
| Ord AnonymousRAngleEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Ordering # (<) :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Bool # (<=) :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Bool # (>) :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Bool # (>=) :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> Bool # max :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> AnonymousRAngleEqual # min :: AnonymousRAngleEqual -> AnonymousRAngleEqual -> AnonymousRAngleEqual # | |
| Show AnonymousRAngleEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRAngleEqual -> ShowS # show :: AnonymousRAngleEqual -> String # showList :: [AnonymousRAngleEqual] -> ShowS # | |
data AnonymousRAngle Source #
Constructors
| AnonymousRAngle |
Instances
| Eq AnonymousRAngle Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRAngle -> AnonymousRAngle -> Bool # (/=) :: AnonymousRAngle -> AnonymousRAngle -> Bool # | |
| Ord AnonymousRAngle Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRAngle -> AnonymousRAngle -> Ordering # (<) :: AnonymousRAngle -> AnonymousRAngle -> Bool # (<=) :: AnonymousRAngle -> AnonymousRAngle -> Bool # (>) :: AnonymousRAngle -> AnonymousRAngle -> Bool # (>=) :: AnonymousRAngle -> AnonymousRAngle -> Bool # max :: AnonymousRAngle -> AnonymousRAngle -> AnonymousRAngle # min :: AnonymousRAngle -> AnonymousRAngle -> AnonymousRAngle # | |
| Show AnonymousRAngle Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRAngle -> ShowS # show :: AnonymousRAngle -> String # showList :: [AnonymousRAngle] -> ShowS # | |
data AnonymousLAngleRAngle Source #
Constructors
| AnonymousLAngleRAngle |
Instances
| Eq AnonymousLAngleRAngle Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Bool # (/=) :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Bool # | |
| Ord AnonymousLAngleRAngle Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Ordering # (<) :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Bool # (<=) :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Bool # (>) :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Bool # (>=) :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> Bool # max :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> AnonymousLAngleRAngle # min :: AnonymousLAngleRAngle -> AnonymousLAngleRAngle -> AnonymousLAngleRAngle # | |
| Show AnonymousLAngleRAngle Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLAngleRAngle -> ShowS # show :: AnonymousLAngleRAngle -> String # showList :: [AnonymousLAngleRAngle] -> ShowS # | |
data AnonymousIs Source #
Constructors
| AnonymousIs |
Instances
| Eq AnonymousIs Source # | |
Defined in TreeSitter.Python.AST | |
| Ord AnonymousIs Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousIs -> AnonymousIs -> Ordering # (<) :: AnonymousIs -> AnonymousIs -> Bool # (<=) :: AnonymousIs -> AnonymousIs -> Bool # (>) :: AnonymousIs -> AnonymousIs -> Bool # (>=) :: AnonymousIs -> AnonymousIs -> Bool # max :: AnonymousIs -> AnonymousIs -> AnonymousIs # min :: AnonymousIs -> AnonymousIs -> AnonymousIs # | |
| Show AnonymousIs Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousIs -> ShowS # show :: AnonymousIs -> String # showList :: [AnonymousIs] -> ShowS # | |
data AnonymousLambda Source #
Constructors
| AnonymousLambda |
Instances
| Eq AnonymousLambda Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLambda -> AnonymousLambda -> Bool # (/=) :: AnonymousLambda -> AnonymousLambda -> Bool # | |
| Ord AnonymousLambda Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLambda -> AnonymousLambda -> Ordering # (<) :: AnonymousLambda -> AnonymousLambda -> Bool # (<=) :: AnonymousLambda -> AnonymousLambda -> Bool # (>) :: AnonymousLambda -> AnonymousLambda -> Bool # (>=) :: AnonymousLambda -> AnonymousLambda -> Bool # max :: AnonymousLambda -> AnonymousLambda -> AnonymousLambda # min :: AnonymousLambda -> AnonymousLambda -> AnonymousLambda # | |
| Show AnonymousLambda Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLambda -> ShowS # show :: AnonymousLambda -> String # showList :: [AnonymousLambda] -> ShowS # | |
data AnonymousPlusEqual Source #
Constructors
| AnonymousPlusEqual |
Instances
| Eq AnonymousPlusEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPlusEqual -> AnonymousPlusEqual -> Bool # (/=) :: AnonymousPlusEqual -> AnonymousPlusEqual -> Bool # | |
| Ord AnonymousPlusEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPlusEqual -> AnonymousPlusEqual -> Ordering # (<) :: AnonymousPlusEqual -> AnonymousPlusEqual -> Bool # (<=) :: AnonymousPlusEqual -> AnonymousPlusEqual -> Bool # (>) :: AnonymousPlusEqual -> AnonymousPlusEqual -> Bool # (>=) :: AnonymousPlusEqual -> AnonymousPlusEqual -> Bool # max :: AnonymousPlusEqual -> AnonymousPlusEqual -> AnonymousPlusEqual # min :: AnonymousPlusEqual -> AnonymousPlusEqual -> AnonymousPlusEqual # | |
| Show AnonymousPlusEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPlusEqual -> ShowS # show :: AnonymousPlusEqual -> String # showList :: [AnonymousPlusEqual] -> ShowS # | |
data AnonymousMinusEqual Source #
Constructors
| AnonymousMinusEqual |
Instances
| Eq AnonymousMinusEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousMinusEqual -> AnonymousMinusEqual -> Bool # (/=) :: AnonymousMinusEqual -> AnonymousMinusEqual -> Bool # | |
| Ord AnonymousMinusEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousMinusEqual -> AnonymousMinusEqual -> Ordering # (<) :: AnonymousMinusEqual -> AnonymousMinusEqual -> Bool # (<=) :: AnonymousMinusEqual -> AnonymousMinusEqual -> Bool # (>) :: AnonymousMinusEqual -> AnonymousMinusEqual -> Bool # (>=) :: AnonymousMinusEqual -> AnonymousMinusEqual -> Bool # max :: AnonymousMinusEqual -> AnonymousMinusEqual -> AnonymousMinusEqual # min :: AnonymousMinusEqual -> AnonymousMinusEqual -> AnonymousMinusEqual # | |
| Show AnonymousMinusEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousMinusEqual -> ShowS # show :: AnonymousMinusEqual -> String # showList :: [AnonymousMinusEqual] -> ShowS # | |
data AnonymousStarEqual Source #
Constructors
| AnonymousStarEqual |
Instances
| Eq AnonymousStarEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousStarEqual -> AnonymousStarEqual -> Bool # (/=) :: AnonymousStarEqual -> AnonymousStarEqual -> Bool # | |
| Ord AnonymousStarEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousStarEqual -> AnonymousStarEqual -> Ordering # (<) :: AnonymousStarEqual -> AnonymousStarEqual -> Bool # (<=) :: AnonymousStarEqual -> AnonymousStarEqual -> Bool # (>) :: AnonymousStarEqual -> AnonymousStarEqual -> Bool # (>=) :: AnonymousStarEqual -> AnonymousStarEqual -> Bool # max :: AnonymousStarEqual -> AnonymousStarEqual -> AnonymousStarEqual # min :: AnonymousStarEqual -> AnonymousStarEqual -> AnonymousStarEqual # | |
| Show AnonymousStarEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousStarEqual -> ShowS # show :: AnonymousStarEqual -> String # showList :: [AnonymousStarEqual] -> ShowS # | |
data AnonymousSlashEqual Source #
Constructors
| AnonymousSlashEqual |
Instances
| Eq AnonymousSlashEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousSlashEqual -> AnonymousSlashEqual -> Bool # (/=) :: AnonymousSlashEqual -> AnonymousSlashEqual -> Bool # | |
| Ord AnonymousSlashEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousSlashEqual -> AnonymousSlashEqual -> Ordering # (<) :: AnonymousSlashEqual -> AnonymousSlashEqual -> Bool # (<=) :: AnonymousSlashEqual -> AnonymousSlashEqual -> Bool # (>) :: AnonymousSlashEqual -> AnonymousSlashEqual -> Bool # (>=) :: AnonymousSlashEqual -> AnonymousSlashEqual -> Bool # max :: AnonymousSlashEqual -> AnonymousSlashEqual -> AnonymousSlashEqual # min :: AnonymousSlashEqual -> AnonymousSlashEqual -> AnonymousSlashEqual # | |
| Show AnonymousSlashEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousSlashEqual -> ShowS # show :: AnonymousSlashEqual -> String # showList :: [AnonymousSlashEqual] -> ShowS # | |
data AnonymousAtEqual Source #
Constructors
| AnonymousAtEqual |
Instances
| Eq AnonymousAtEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousAtEqual -> AnonymousAtEqual -> Bool # (/=) :: AnonymousAtEqual -> AnonymousAtEqual -> Bool # | |
| Ord AnonymousAtEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAtEqual -> AnonymousAtEqual -> Ordering # (<) :: AnonymousAtEqual -> AnonymousAtEqual -> Bool # (<=) :: AnonymousAtEqual -> AnonymousAtEqual -> Bool # (>) :: AnonymousAtEqual -> AnonymousAtEqual -> Bool # (>=) :: AnonymousAtEqual -> AnonymousAtEqual -> Bool # max :: AnonymousAtEqual -> AnonymousAtEqual -> AnonymousAtEqual # min :: AnonymousAtEqual -> AnonymousAtEqual -> AnonymousAtEqual # | |
| Show AnonymousAtEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAtEqual -> ShowS # show :: AnonymousAtEqual -> String # showList :: [AnonymousAtEqual] -> ShowS # | |
data AnonymousSlashSlashEqual Source #
Constructors
| AnonymousSlashSlashEqual |
Instances
data AnonymousPercentEqual Source #
Constructors
| AnonymousPercentEqual |
Instances
| Eq AnonymousPercentEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPercentEqual -> AnonymousPercentEqual -> Bool # (/=) :: AnonymousPercentEqual -> AnonymousPercentEqual -> Bool # | |
| Ord AnonymousPercentEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPercentEqual -> AnonymousPercentEqual -> Ordering # (<) :: AnonymousPercentEqual -> AnonymousPercentEqual -> Bool # (<=) :: AnonymousPercentEqual -> AnonymousPercentEqual -> Bool # (>) :: AnonymousPercentEqual -> AnonymousPercentEqual -> Bool # (>=) :: AnonymousPercentEqual -> AnonymousPercentEqual -> Bool # max :: AnonymousPercentEqual -> AnonymousPercentEqual -> AnonymousPercentEqual # min :: AnonymousPercentEqual -> AnonymousPercentEqual -> AnonymousPercentEqual # | |
| Show AnonymousPercentEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPercentEqual -> ShowS # show :: AnonymousPercentEqual -> String # showList :: [AnonymousPercentEqual] -> ShowS # | |
data AnonymousStarStarEqual Source #
Constructors
| AnonymousStarStarEqual |
Instances
data AnonymousRAngleRAngleEqual Source #
Constructors
| AnonymousRAngleRAngleEqual |
Instances
data AnonymousLAngleLAngleEqual Source #
Constructors
| AnonymousLAngleLAngleEqual |
Instances
data AnonymousAmpersandEqual Source #
Constructors
| AnonymousAmpersandEqual |
Instances
data AnonymousCaretEqual Source #
Constructors
| AnonymousCaretEqual |
Instances
| Eq AnonymousCaretEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousCaretEqual -> AnonymousCaretEqual -> Bool # (/=) :: AnonymousCaretEqual -> AnonymousCaretEqual -> Bool # | |
| Ord AnonymousCaretEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousCaretEqual -> AnonymousCaretEqual -> Ordering # (<) :: AnonymousCaretEqual -> AnonymousCaretEqual -> Bool # (<=) :: AnonymousCaretEqual -> AnonymousCaretEqual -> Bool # (>) :: AnonymousCaretEqual -> AnonymousCaretEqual -> Bool # (>=) :: AnonymousCaretEqual -> AnonymousCaretEqual -> Bool # max :: AnonymousCaretEqual -> AnonymousCaretEqual -> AnonymousCaretEqual # min :: AnonymousCaretEqual -> AnonymousCaretEqual -> AnonymousCaretEqual # | |
| Show AnonymousCaretEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousCaretEqual -> ShowS # show :: AnonymousCaretEqual -> String # showList :: [AnonymousCaretEqual] -> ShowS # | |
data AnonymousPipeEqual Source #
Constructors
| AnonymousPipeEqual |
Instances
| Eq AnonymousPipeEqual Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousPipeEqual -> AnonymousPipeEqual -> Bool # (/=) :: AnonymousPipeEqual -> AnonymousPipeEqual -> Bool # | |
| Ord AnonymousPipeEqual Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousPipeEqual -> AnonymousPipeEqual -> Ordering # (<) :: AnonymousPipeEqual -> AnonymousPipeEqual -> Bool # (<=) :: AnonymousPipeEqual -> AnonymousPipeEqual -> Bool # (>) :: AnonymousPipeEqual -> AnonymousPipeEqual -> Bool # (>=) :: AnonymousPipeEqual -> AnonymousPipeEqual -> Bool # max :: AnonymousPipeEqual -> AnonymousPipeEqual -> AnonymousPipeEqual # min :: AnonymousPipeEqual -> AnonymousPipeEqual -> AnonymousPipeEqual # | |
| Show AnonymousPipeEqual Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousPipeEqual -> ShowS # show :: AnonymousPipeEqual -> String # showList :: [AnonymousPipeEqual] -> ShowS # | |
data AnonymousYield Source #
Constructors
| AnonymousYield |
Instances
| Eq AnonymousYield Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousYield -> AnonymousYield -> Bool # (/=) :: AnonymousYield -> AnonymousYield -> Bool # | |
| Ord AnonymousYield Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousYield -> AnonymousYield -> Ordering # (<) :: AnonymousYield -> AnonymousYield -> Bool # (<=) :: AnonymousYield -> AnonymousYield -> Bool # (>) :: AnonymousYield -> AnonymousYield -> Bool # (>=) :: AnonymousYield -> AnonymousYield -> Bool # max :: AnonymousYield -> AnonymousYield -> AnonymousYield # min :: AnonymousYield -> AnonymousYield -> AnonymousYield # | |
| Show AnonymousYield Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousYield -> ShowS # show :: AnonymousYield -> String # showList :: [AnonymousYield] -> ShowS # | |
data AnonymousLBracket Source #
Constructors
| AnonymousLBracket |
Instances
| Eq AnonymousLBracket Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLBracket -> AnonymousLBracket -> Bool # (/=) :: AnonymousLBracket -> AnonymousLBracket -> Bool # | |
| Ord AnonymousLBracket Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLBracket -> AnonymousLBracket -> Ordering # (<) :: AnonymousLBracket -> AnonymousLBracket -> Bool # (<=) :: AnonymousLBracket -> AnonymousLBracket -> Bool # (>) :: AnonymousLBracket -> AnonymousLBracket -> Bool # (>=) :: AnonymousLBracket -> AnonymousLBracket -> Bool # max :: AnonymousLBracket -> AnonymousLBracket -> AnonymousLBracket # min :: AnonymousLBracket -> AnonymousLBracket -> AnonymousLBracket # | |
| Show AnonymousLBracket Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLBracket -> ShowS # show :: AnonymousLBracket -> String # showList :: [AnonymousLBracket] -> ShowS # | |
data AnonymousRBracket Source #
Constructors
| AnonymousRBracket |
Instances
| Eq AnonymousRBracket Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRBracket -> AnonymousRBracket -> Bool # (/=) :: AnonymousRBracket -> AnonymousRBracket -> Bool # | |
| Ord AnonymousRBracket Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRBracket -> AnonymousRBracket -> Ordering # (<) :: AnonymousRBracket -> AnonymousRBracket -> Bool # (<=) :: AnonymousRBracket -> AnonymousRBracket -> Bool # (>) :: AnonymousRBracket -> AnonymousRBracket -> Bool # (>=) :: AnonymousRBracket -> AnonymousRBracket -> Bool # max :: AnonymousRBracket -> AnonymousRBracket -> AnonymousRBracket # min :: AnonymousRBracket -> AnonymousRBracket -> AnonymousRBracket # | |
| Show AnonymousRBracket Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRBracket -> ShowS # show :: AnonymousRBracket -> String # showList :: [AnonymousRBracket] -> ShowS # | |
data AnonymousLBrace Source #
Constructors
| AnonymousLBrace |
Instances
| Eq AnonymousLBrace Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousLBrace -> AnonymousLBrace -> Bool # (/=) :: AnonymousLBrace -> AnonymousLBrace -> Bool # | |
| Ord AnonymousLBrace Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousLBrace -> AnonymousLBrace -> Ordering # (<) :: AnonymousLBrace -> AnonymousLBrace -> Bool # (<=) :: AnonymousLBrace -> AnonymousLBrace -> Bool # (>) :: AnonymousLBrace -> AnonymousLBrace -> Bool # (>=) :: AnonymousLBrace -> AnonymousLBrace -> Bool # max :: AnonymousLBrace -> AnonymousLBrace -> AnonymousLBrace # min :: AnonymousLBrace -> AnonymousLBrace -> AnonymousLBrace # | |
| Show AnonymousLBrace Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousLBrace -> ShowS # show :: AnonymousLBrace -> String # showList :: [AnonymousLBrace] -> ShowS # | |
data AnonymousRBrace Source #
Constructors
| AnonymousRBrace |
Instances
| Eq AnonymousRBrace Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousRBrace -> AnonymousRBrace -> Bool # (/=) :: AnonymousRBrace -> AnonymousRBrace -> Bool # | |
| Ord AnonymousRBrace Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousRBrace -> AnonymousRBrace -> Ordering # (<) :: AnonymousRBrace -> AnonymousRBrace -> Bool # (<=) :: AnonymousRBrace -> AnonymousRBrace -> Bool # (>) :: AnonymousRBrace -> AnonymousRBrace -> Bool # (>=) :: AnonymousRBrace -> AnonymousRBrace -> Bool # max :: AnonymousRBrace -> AnonymousRBrace -> AnonymousRBrace # min :: AnonymousRBrace -> AnonymousRBrace -> AnonymousRBrace # | |
| Show AnonymousRBrace Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousRBrace -> ShowS # show :: AnonymousRBrace -> String # showList :: [AnonymousRBrace] -> ShowS # | |
newtype EscapeSequence Source #
Constructors
| EscapeSequence | |
Instances
| Eq EscapeSequence Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: EscapeSequence -> EscapeSequence -> Bool # (/=) :: EscapeSequence -> EscapeSequence -> Bool # | |
| Ord EscapeSequence Source # | |
Defined in TreeSitter.Python.AST Methods compare :: EscapeSequence -> EscapeSequence -> Ordering # (<) :: EscapeSequence -> EscapeSequence -> Bool # (<=) :: EscapeSequence -> EscapeSequence -> Bool # (>) :: EscapeSequence -> EscapeSequence -> Bool # (>=) :: EscapeSequence -> EscapeSequence -> Bool # max :: EscapeSequence -> EscapeSequence -> EscapeSequence # min :: EscapeSequence -> EscapeSequence -> EscapeSequence # | |
| Show EscapeSequence Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> EscapeSequence -> ShowS # show :: EscapeSequence -> String # showList :: [EscapeSequence] -> ShowS # | |
newtype TypeConversion Source #
Constructors
| TypeConversion | |
Instances
| Eq TypeConversion Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: TypeConversion -> TypeConversion -> Bool # (/=) :: TypeConversion -> TypeConversion -> Bool # | |
| Ord TypeConversion Source # | |
Defined in TreeSitter.Python.AST Methods compare :: TypeConversion -> TypeConversion -> Ordering # (<) :: TypeConversion -> TypeConversion -> Bool # (<=) :: TypeConversion -> TypeConversion -> Bool # (>) :: TypeConversion -> TypeConversion -> Bool # (>=) :: TypeConversion -> TypeConversion -> Bool # max :: TypeConversion -> TypeConversion -> TypeConversion # min :: TypeConversion -> TypeConversion -> TypeConversion # | |
| Show TypeConversion Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> TypeConversion -> ShowS # show :: TypeConversion -> String # showList :: [TypeConversion] -> ShowS # | |
newtype Identifier Source #
Constructors
| Identifier | |
Instances
| Eq Identifier Source # | |
Defined in TreeSitter.Python.AST | |
| Ord Identifier Source # | |
Defined in TreeSitter.Python.AST Methods compare :: Identifier -> Identifier -> Ordering # (<) :: Identifier -> Identifier -> Bool # (<=) :: Identifier -> Identifier -> Bool # (>) :: Identifier -> Identifier -> Bool # (>=) :: Identifier -> Identifier -> Bool # max :: Identifier -> Identifier -> Identifier # min :: Identifier -> Identifier -> Identifier # | |
| Show Identifier Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> Identifier -> ShowS # show :: Identifier -> String # showList :: [Identifier] -> ShowS # | |
data AliasedImport Source #
Constructors
| AliasedImport | |
Fields
| |
Instances
| Eq AliasedImport Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AliasedImport -> AliasedImport -> Bool # (/=) :: AliasedImport -> AliasedImport -> Bool # | |
| Ord AliasedImport Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AliasedImport -> AliasedImport -> Ordering # (<) :: AliasedImport -> AliasedImport -> Bool # (<=) :: AliasedImport -> AliasedImport -> Bool # (>) :: AliasedImport -> AliasedImport -> Bool # (>=) :: AliasedImport -> AliasedImport -> Bool # max :: AliasedImport -> AliasedImport -> AliasedImport # min :: AliasedImport -> AliasedImport -> AliasedImport # | |
| Show AliasedImport Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AliasedImport -> ShowS # show :: AliasedImport -> String # showList :: [AliasedImport] -> ShowS # | |
data ImportStatement Source #
Constructors
| ImportStatement | |
Fields
| |
Instances
| Eq ImportStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ImportStatement -> ImportStatement -> Bool # (/=) :: ImportStatement -> ImportStatement -> Bool # | |
| Ord ImportStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ImportStatement -> ImportStatement -> Ordering # (<) :: ImportStatement -> ImportStatement -> Bool # (<=) :: ImportStatement -> ImportStatement -> Bool # (>) :: ImportStatement -> ImportStatement -> Bool # (>=) :: ImportStatement -> ImportStatement -> Bool # max :: ImportStatement -> ImportStatement -> ImportStatement # min :: ImportStatement -> ImportStatement -> ImportStatement # | |
| Show ImportStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ImportStatement -> ShowS # show :: ImportStatement -> String # showList :: [ImportStatement] -> ShowS # | |
data ImportFromStatement Source #
Constructors
| ImportFromStatement | |
Fields
| |
Instances
| Eq ImportFromStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ImportFromStatement -> ImportFromStatement -> Bool # (/=) :: ImportFromStatement -> ImportFromStatement -> Bool # | |
| Ord ImportFromStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ImportFromStatement -> ImportFromStatement -> Ordering # (<) :: ImportFromStatement -> ImportFromStatement -> Bool # (<=) :: ImportFromStatement -> ImportFromStatement -> Bool # (>) :: ImportFromStatement -> ImportFromStatement -> Bool # (>=) :: ImportFromStatement -> ImportFromStatement -> Bool # max :: ImportFromStatement -> ImportFromStatement -> ImportFromStatement # min :: ImportFromStatement -> ImportFromStatement -> ImportFromStatement # | |
| Show ImportFromStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ImportFromStatement -> ShowS # show :: ImportFromStatement -> String # showList :: [ImportFromStatement] -> ShowS # | |
data FutureImportStatement Source #
Constructors
| FutureImportStatement | |
Fields
| |
Instances
| Eq FutureImportStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: FutureImportStatement -> FutureImportStatement -> Bool # (/=) :: FutureImportStatement -> FutureImportStatement -> Bool # | |
| Ord FutureImportStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: FutureImportStatement -> FutureImportStatement -> Ordering # (<) :: FutureImportStatement -> FutureImportStatement -> Bool # (<=) :: FutureImportStatement -> FutureImportStatement -> Bool # (>) :: FutureImportStatement -> FutureImportStatement -> Bool # (>=) :: FutureImportStatement -> FutureImportStatement -> Bool # max :: FutureImportStatement -> FutureImportStatement -> FutureImportStatement # min :: FutureImportStatement -> FutureImportStatement -> FutureImportStatement # | |
| Show FutureImportStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> FutureImportStatement -> ShowS # show :: FutureImportStatement -> String # showList :: [FutureImportStatement] -> ShowS # | |
data PrimaryExpression Source #
Constructors
Instances
| Eq PrimaryExpression Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: PrimaryExpression -> PrimaryExpression -> Bool # (/=) :: PrimaryExpression -> PrimaryExpression -> Bool # | |
| Ord PrimaryExpression Source # | |
Defined in TreeSitter.Python.AST Methods compare :: PrimaryExpression -> PrimaryExpression -> Ordering # (<) :: PrimaryExpression -> PrimaryExpression -> Bool # (<=) :: PrimaryExpression -> PrimaryExpression -> Bool # (>) :: PrimaryExpression -> PrimaryExpression -> Bool # (>=) :: PrimaryExpression -> PrimaryExpression -> Bool # max :: PrimaryExpression -> PrimaryExpression -> PrimaryExpression # min :: PrimaryExpression -> PrimaryExpression -> PrimaryExpression # | |
| Show PrimaryExpression Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> PrimaryExpression -> ShowS # show :: PrimaryExpression -> String # showList :: [PrimaryExpression] -> ShowS # | |
data UnaryOperator Source #
Constructors
| UnaryOperator | |
Fields | |
Instances
| Eq UnaryOperator Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: UnaryOperator -> UnaryOperator -> Bool # (/=) :: UnaryOperator -> UnaryOperator -> Bool # | |
| Ord UnaryOperator Source # | |
Defined in TreeSitter.Python.AST Methods compare :: UnaryOperator -> UnaryOperator -> Ordering # (<) :: UnaryOperator -> UnaryOperator -> Bool # (<=) :: UnaryOperator -> UnaryOperator -> Bool # (>) :: UnaryOperator -> UnaryOperator -> Bool # (>=) :: UnaryOperator -> UnaryOperator -> Bool # max :: UnaryOperator -> UnaryOperator -> UnaryOperator # min :: UnaryOperator -> UnaryOperator -> UnaryOperator # | |
| Show UnaryOperator Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> UnaryOperator -> ShowS # show :: UnaryOperator -> String # showList :: [UnaryOperator] -> ShowS # | |
data BinaryOperator Source #
Constructors
Instances
| Eq BinaryOperator Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: BinaryOperator -> BinaryOperator -> Bool # (/=) :: BinaryOperator -> BinaryOperator -> Bool # | |
| Ord BinaryOperator Source # | |
Defined in TreeSitter.Python.AST Methods compare :: BinaryOperator -> BinaryOperator -> Ordering # (<) :: BinaryOperator -> BinaryOperator -> Bool # (<=) :: BinaryOperator -> BinaryOperator -> Bool # (>) :: BinaryOperator -> BinaryOperator -> Bool # (>=) :: BinaryOperator -> BinaryOperator -> Bool # max :: BinaryOperator -> BinaryOperator -> BinaryOperator # min :: BinaryOperator -> BinaryOperator -> BinaryOperator # | |
| Show BinaryOperator Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> BinaryOperator -> ShowS # show :: BinaryOperator -> String # showList :: [BinaryOperator] -> ShowS # | |
data Expression Source #
Constructors
Instances
| Eq Expression Source # | |
Defined in TreeSitter.Python.AST | |
| Ord Expression Source # | |
Defined in TreeSitter.Python.AST Methods compare :: Expression -> Expression -> Ordering # (<) :: Expression -> Expression -> Bool # (<=) :: Expression -> Expression -> Bool # (>) :: Expression -> Expression -> Bool # (>=) :: Expression -> Expression -> Bool # max :: Expression -> Expression -> Expression # min :: Expression -> Expression -> Expression # | |
| Show Expression Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> Expression -> ShowS # show :: Expression -> String # showList :: [Expression] -> ShowS # | |
data NotOperator Source #
Constructors
| NotOperator | |
Fields | |
Instances
| Eq NotOperator Source # | |
Defined in TreeSitter.Python.AST | |
| Ord NotOperator Source # | |
Defined in TreeSitter.Python.AST Methods compare :: NotOperator -> NotOperator -> Ordering # (<) :: NotOperator -> NotOperator -> Bool # (<=) :: NotOperator -> NotOperator -> Bool # (>) :: NotOperator -> NotOperator -> Bool # (>=) :: NotOperator -> NotOperator -> Bool # max :: NotOperator -> NotOperator -> NotOperator # min :: NotOperator -> NotOperator -> NotOperator # | |
| Show NotOperator Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> NotOperator -> ShowS # show :: NotOperator -> String # showList :: [NotOperator] -> ShowS # | |
Constructors
| Lambda | |
Fields
| |
data BooleanOperator Source #
Constructors
| BooleanOperator | |
Fields
| |
Instances
| Eq BooleanOperator Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: BooleanOperator -> BooleanOperator -> Bool # (/=) :: BooleanOperator -> BooleanOperator -> Bool # | |
| Ord BooleanOperator Source # | |
Defined in TreeSitter.Python.AST Methods compare :: BooleanOperator -> BooleanOperator -> Ordering # (<) :: BooleanOperator -> BooleanOperator -> Bool # (<=) :: BooleanOperator -> BooleanOperator -> Bool # (>) :: BooleanOperator -> BooleanOperator -> Bool # (>=) :: BooleanOperator -> BooleanOperator -> Bool # max :: BooleanOperator -> BooleanOperator -> BooleanOperator # min :: BooleanOperator -> BooleanOperator -> BooleanOperator # | |
| Show BooleanOperator Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> BooleanOperator -> ShowS # show :: BooleanOperator -> String # showList :: [BooleanOperator] -> ShowS # | |
data PrintStatement Source #
Constructors
| PrintStatement | |
Fields
| |
Instances
| Eq PrintStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: PrintStatement -> PrintStatement -> Bool # (/=) :: PrintStatement -> PrintStatement -> Bool # | |
| Ord PrintStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: PrintStatement -> PrintStatement -> Ordering # (<) :: PrintStatement -> PrintStatement -> Bool # (<=) :: PrintStatement -> PrintStatement -> Bool # (>) :: PrintStatement -> PrintStatement -> Bool # (>=) :: PrintStatement -> PrintStatement -> Bool # max :: PrintStatement -> PrintStatement -> PrintStatement # min :: PrintStatement -> PrintStatement -> PrintStatement # | |
| Show PrintStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> PrintStatement -> ShowS # show :: PrintStatement -> String # showList :: [PrintStatement] -> ShowS # | |
data SimpleStatement Source #
Constructors
Instances
| Eq SimpleStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: SimpleStatement -> SimpleStatement -> Bool # (/=) :: SimpleStatement -> SimpleStatement -> Bool # | |
| Ord SimpleStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: SimpleStatement -> SimpleStatement -> Ordering # (<) :: SimpleStatement -> SimpleStatement -> Bool # (<=) :: SimpleStatement -> SimpleStatement -> Bool # (>) :: SimpleStatement -> SimpleStatement -> Bool # (>=) :: SimpleStatement -> SimpleStatement -> Bool # max :: SimpleStatement -> SimpleStatement -> SimpleStatement # min :: SimpleStatement -> SimpleStatement -> SimpleStatement # | |
| Show SimpleStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> SimpleStatement -> ShowS # show :: SimpleStatement -> String # showList :: [SimpleStatement] -> ShowS # | |
data ElifClause Source #
Constructors
| ElifClause | |
Fields
| |
Instances
| Eq ElifClause Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ElifClause Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ElifClause -> ElifClause -> Ordering # (<) :: ElifClause -> ElifClause -> Bool # (<=) :: ElifClause -> ElifClause -> Bool # (>) :: ElifClause -> ElifClause -> Bool # (>=) :: ElifClause -> ElifClause -> Bool # max :: ElifClause -> ElifClause -> ElifClause # min :: ElifClause -> ElifClause -> ElifClause # | |
| Show ElifClause Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ElifClause -> ShowS # show :: ElifClause -> String # showList :: [ElifClause] -> ShowS # | |
data CompoundStatement Source #
Constructors
Instances
| Eq CompoundStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: CompoundStatement -> CompoundStatement -> Bool # (/=) :: CompoundStatement -> CompoundStatement -> Bool # | |
| Ord CompoundStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: CompoundStatement -> CompoundStatement -> Ordering # (<) :: CompoundStatement -> CompoundStatement -> Bool # (<=) :: CompoundStatement -> CompoundStatement -> Bool # (>) :: CompoundStatement -> CompoundStatement -> Bool # (>=) :: CompoundStatement -> CompoundStatement -> Bool # max :: CompoundStatement -> CompoundStatement -> CompoundStatement # min :: CompoundStatement -> CompoundStatement -> CompoundStatement # | |
| Show CompoundStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> CompoundStatement -> ShowS # show :: CompoundStatement -> String # showList :: [CompoundStatement] -> ShowS # | |
data WhileStatement Source #
Constructors
| WhileStatement | |
Fields
| |
Instances
| Eq WhileStatement Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: WhileStatement -> WhileStatement -> Bool # (/=) :: WhileStatement -> WhileStatement -> Bool # | |
| Ord WhileStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: WhileStatement -> WhileStatement -> Ordering # (<) :: WhileStatement -> WhileStatement -> Bool # (<=) :: WhileStatement -> WhileStatement -> Bool # (>) :: WhileStatement -> WhileStatement -> Bool # (>=) :: WhileStatement -> WhileStatement -> Bool # max :: WhileStatement -> WhileStatement -> WhileStatement # min :: WhileStatement -> WhileStatement -> WhileStatement # | |
| Show WhileStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> WhileStatement -> ShowS # show :: WhileStatement -> String # showList :: [WhileStatement] -> ShowS # | |
data ElseClause Source #
Constructors
| ElseClause | |
Instances
| Eq ElseClause Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ElseClause Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ElseClause -> ElseClause -> Ordering # (<) :: ElseClause -> ElseClause -> Bool # (<=) :: ElseClause -> ElseClause -> Bool # (>) :: ElseClause -> ElseClause -> Bool # (>=) :: ElseClause -> ElseClause -> Bool # max :: ElseClause -> ElseClause -> ElseClause # min :: ElseClause -> ElseClause -> ElseClause # | |
| Show ElseClause Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ElseClause -> ShowS # show :: ElseClause -> String # showList :: [ElseClause] -> ShowS # | |
data TryStatement Source #
Constructors
| TryStatement | |
Instances
| Eq TryStatement Source # | |
Defined in TreeSitter.Python.AST | |
| Ord TryStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: TryStatement -> TryStatement -> Ordering # (<) :: TryStatement -> TryStatement -> Bool # (<=) :: TryStatement -> TryStatement -> Bool # (>) :: TryStatement -> TryStatement -> Bool # (>=) :: TryStatement -> TryStatement -> Bool # max :: TryStatement -> TryStatement -> TryStatement # min :: TryStatement -> TryStatement -> TryStatement # | |
| Show TryStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> TryStatement -> ShowS # show :: TryStatement -> String # showList :: [TryStatement] -> ShowS # | |
data IfStatement Source #
Constructors
| IfStatement | |
Fields
| |
Instances
| Eq IfStatement Source # | |
Defined in TreeSitter.Python.AST | |
| Ord IfStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: IfStatement -> IfStatement -> Ordering # (<) :: IfStatement -> IfStatement -> Bool # (<=) :: IfStatement -> IfStatement -> Bool # (>) :: IfStatement -> IfStatement -> Bool # (>=) :: IfStatement -> IfStatement -> Bool # max :: IfStatement -> IfStatement -> IfStatement # min :: IfStatement -> IfStatement -> IfStatement # | |
| Show IfStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> IfStatement -> ShowS # show :: IfStatement -> String # showList :: [IfStatement] -> ShowS # | |
data FunctionDefinition Source #
Constructors
| FunctionDefinition | |
Fields
| |
Instances
| Eq FunctionDefinition Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: FunctionDefinition -> FunctionDefinition -> Bool # (/=) :: FunctionDefinition -> FunctionDefinition -> Bool # | |
| Ord FunctionDefinition Source # | |
Defined in TreeSitter.Python.AST Methods compare :: FunctionDefinition -> FunctionDefinition -> Ordering # (<) :: FunctionDefinition -> FunctionDefinition -> Bool # (<=) :: FunctionDefinition -> FunctionDefinition -> Bool # (>) :: FunctionDefinition -> FunctionDefinition -> Bool # (>=) :: FunctionDefinition -> FunctionDefinition -> Bool # max :: FunctionDefinition -> FunctionDefinition -> FunctionDefinition # min :: FunctionDefinition -> FunctionDefinition -> FunctionDefinition # | |
| Show FunctionDefinition Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> FunctionDefinition -> ShowS # show :: FunctionDefinition -> String # showList :: [FunctionDefinition] -> ShowS # | |
data ForStatement Source #
Constructors
| ForStatement | |
Fields
| |
Instances
| Eq ForStatement Source # | |
Defined in TreeSitter.Python.AST | |
| Ord ForStatement Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ForStatement -> ForStatement -> Ordering # (<) :: ForStatement -> ForStatement -> Bool # (<=) :: ForStatement -> ForStatement -> Bool # (>) :: ForStatement -> ForStatement -> Bool # (>=) :: ForStatement -> ForStatement -> Bool # max :: ForStatement -> ForStatement -> ForStatement # min :: ForStatement -> ForStatement -> ForStatement # | |
| Show ForStatement Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ForStatement -> ShowS # show :: ForStatement -> String # showList :: [ForStatement] -> ShowS # | |
data ClassDefinition Source #
Constructors
| ClassDefinition | |
Fields
| |
Instances
| Eq ClassDefinition Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: ClassDefinition -> ClassDefinition -> Bool # (/=) :: ClassDefinition -> ClassDefinition -> Bool # | |
| Ord ClassDefinition Source # | |
Defined in TreeSitter.Python.AST Methods compare :: ClassDefinition -> ClassDefinition -> Ordering # (<) :: ClassDefinition -> ClassDefinition -> Bool # (<=) :: ClassDefinition -> ClassDefinition -> Bool # (>) :: ClassDefinition -> ClassDefinition -> Bool # (>=) :: ClassDefinition -> ClassDefinition -> Bool # max :: ClassDefinition -> ClassDefinition -> ClassDefinition # min :: ClassDefinition -> ClassDefinition -> ClassDefinition # | |
| Show ClassDefinition Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> ClassDefinition -> ShowS # show :: ClassDefinition -> String # showList :: [ClassDefinition] -> ShowS # | |
data AnonymousAwait Source #
Constructors
| AnonymousAwait |
Instances
| Eq AnonymousAwait Source # | |
Defined in TreeSitter.Python.AST Methods (==) :: AnonymousAwait -> AnonymousAwait -> Bool # (/=) :: AnonymousAwait -> AnonymousAwait -> Bool # | |
| Ord AnonymousAwait Source # | |
Defined in TreeSitter.Python.AST Methods compare :: AnonymousAwait -> AnonymousAwait -> Ordering # (<) :: AnonymousAwait -> AnonymousAwait -> Bool # (<=) :: AnonymousAwait -> AnonymousAwait -> Bool # (>) :: AnonymousAwait -> AnonymousAwait -> Bool # (>=) :: AnonymousAwait -> AnonymousAwait -> Bool # max :: AnonymousAwait -> AnonymousAwait -> AnonymousAwait # min :: AnonymousAwait -> AnonymousAwait -> AnonymousAwait # | |
| Show AnonymousAwait Source # | |
Defined in TreeSitter.Python.AST Methods showsPrec :: Int -> AnonymousAwait -> ShowS # show :: AnonymousAwait -> String # showList :: [AnonymousAwait] -> ShowS # | |