| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
TreeSitter.Python.AST
Documentation
newtype BreakStatement Source #
Constructors
| BreakStatement | |
Instances
newtype ContinueStatement Source #
Constructors
| ContinueStatement | |
Instances
newtype ImportPrefix Source #
Constructors
| ImportPrefix | |
Instances
newtype PassStatement Source #
Constructors
| PassStatement | |
Instances
newtype WildcardImport Source #
Constructors
| WildcardImport | |
Instances
data AnonymousImport Source #
Constructors
| AnonymousImport |
Instances
data AnonymousDot Source #
Constructors
| AnonymousDot |
Instances
data AnonymousFrom Source #
Constructors
| AnonymousFrom |
Instances
data AnonymousFuture Source #
Constructors
| AnonymousFuture |
Instances
data AnonymousLParen Source #
Constructors
| AnonymousLParen |
Instances
data AnonymousRParen Source #
Constructors
| AnonymousRParen |
Instances
data AnonymousComma Source #
Constructors
| AnonymousComma |
Instances
data AnonymousAs Source #
Constructors
| AnonymousAs |
Instances
data AnonymousStar Source #
Constructors
| AnonymousStar |
Instances
data AnonymousPrint Source #
Constructors
| AnonymousPrint |
Instances
data AnonymousRAngleRAngle Source #
Constructors
| AnonymousRAngleRAngle |
Instances
data AnonymousAssert Source #
Constructors
| AnonymousAssert |
Instances
data AnonymousColonEqual Source #
Constructors
| AnonymousColonEqual |
Instances
data AnonymousReturn Source #
Constructors
| AnonymousReturn |
Instances
data AnonymousDel Source #
Constructors
| AnonymousDel |
Instances
data AnonymousRaise Source #
Constructors
| AnonymousRaise |
Instances
data AnonymousPass Source #
Constructors
| AnonymousPass |
Instances
data AnonymousBreak Source #
Constructors
| AnonymousBreak |
Instances
data AnonymousContinue Source #
Constructors
| AnonymousContinue |
Instances
data AnonymousIf Source #
Constructors
| AnonymousIf |
Instances
data AnonymousColon Source #
Constructors
| AnonymousColon |
Instances
data AnonymousElif Source #
Constructors
| AnonymousElif |
Instances
data AnonymousElse Source #
Constructors
| AnonymousElse |
Instances
data AnonymousAsync Source #
Constructors
| AnonymousAsync |
Instances
data AnonymousFor Source #
Constructors
| AnonymousFor |
Instances
data AnonymousIn Source #
Constructors
| AnonymousIn |
Instances
data AnonymousWhile Source #
Constructors
| AnonymousWhile |
Instances
data AnonymousTry Source #
Constructors
| AnonymousTry |
Instances
data AnonymousExcept Source #
Constructors
| AnonymousExcept |
Instances
data AnonymousFinally Source #
Constructors
| AnonymousFinally |
Instances
data AnonymousWith Source #
Constructors
| AnonymousWith |
Instances
data AnonymousDef Source #
Constructors
| AnonymousDef |
Instances
data AnonymousMinusRAngle Source #
Constructors
| AnonymousMinusRAngle |
Instances
data AnonymousEqual Source #
Constructors
| AnonymousEqual |
Instances
data AnonymousGlobal Source #
Constructors
| AnonymousGlobal |
Instances
data AnonymousNonlocal Source #
Constructors
| AnonymousNonlocal |
Instances
data AnonymousExec Source #
Constructors
| AnonymousExec |
Instances
data AnonymousClass Source #
Constructors
| AnonymousClass |
Instances
data AnonymousAt Source #
Constructors
| AnonymousAt |
Instances
data AnonymousNot Source #
Constructors
| AnonymousNot |
Instances
data AnonymousAnd Source #
Constructors
| AnonymousAnd |
Instances
data AnonymousOr Source #
Constructors
| AnonymousOr |
Instances
data AnonymousPlus Source #
Constructors
| AnonymousPlus |
Instances
data AnonymousMinus Source #
Constructors
| AnonymousMinus |
Instances
data AnonymousSlash Source #
Constructors
| AnonymousSlash |
Instances
data AnonymousPercent Source #
Constructors
| AnonymousPercent |
Instances
data AnonymousSlashSlash Source #
Constructors
| AnonymousSlashSlash |
Instances
data AnonymousStarStar Source #
Constructors
| AnonymousStarStar |
Instances
data AnonymousPipe Source #
Constructors
| AnonymousPipe |
Instances
data AnonymousAmpersand Source #
Constructors
| AnonymousAmpersand |
Instances
data AnonymousCaret Source #
Constructors
| AnonymousCaret |
Instances
data AnonymousLAngleLAngle Source #
Constructors
| AnonymousLAngleLAngle |
Instances
data AnonymousTilde Source #
Constructors
| AnonymousTilde |
Instances
data AnonymousLAngle Source #
Constructors
| AnonymousLAngle |
Instances
data AnonymousLAngleEqual Source #
Constructors
| AnonymousLAngleEqual |
Instances
data AnonymousEqualEqual Source #
Constructors
| AnonymousEqualEqual |
Instances
data AnonymousBangEqual Source #
Constructors
| AnonymousBangEqual |
Instances
data AnonymousRAngleEqual Source #
Constructors
| AnonymousRAngleEqual |
Instances
data AnonymousRAngle Source #
Constructors
| AnonymousRAngle |
Instances
data AnonymousLAngleRAngle Source #
Constructors
| AnonymousLAngleRAngle |
Instances
data AnonymousIs Source #
Constructors
| AnonymousIs |
Instances
data AnonymousLambda Source #
Constructors
| AnonymousLambda |
Instances
data AnonymousPlusEqual Source #
Constructors
| AnonymousPlusEqual |
Instances
data AnonymousMinusEqual Source #
Constructors
| AnonymousMinusEqual |
Instances
data AnonymousStarEqual Source #
Constructors
| AnonymousStarEqual |
Instances
data AnonymousSlashEqual Source #
Constructors
| AnonymousSlashEqual |
Instances
data AnonymousAtEqual Source #
Constructors
| AnonymousAtEqual |
Instances
data AnonymousSlashSlashEqual Source #
Constructors
| AnonymousSlashSlashEqual |
Instances
data AnonymousPercentEqual Source #
Constructors
| AnonymousPercentEqual |
Instances
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
data AnonymousPipeEqual Source #
Constructors
| AnonymousPipeEqual |
Instances
data AnonymousYield Source #
Constructors
| AnonymousYield |
Instances
data AnonymousLBracket Source #
Constructors
| AnonymousLBracket |
Instances
data AnonymousRBracket Source #
Constructors
| AnonymousRBracket |
Instances
Instances
| Eq Ellipsis Source # | |
| Ord Ellipsis Source # | |
Defined in TreeSitter.Python.AST | |
| Show Ellipsis Source # | |
| Generic Ellipsis Source # | |
| Unmarshal Ellipsis Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Ellipsis | |
| SymbolMatching Ellipsis Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Ellipsis Source # | |
Defined in TreeSitter.Python.AST | |
data AnonymousLBrace Source #
Constructors
| AnonymousLBrace |
Instances
data AnonymousRBrace Source #
Constructors
| AnonymousRBrace |
Instances
newtype EscapeSequence Source #
Constructors
| EscapeSequence | |
Instances
newtype TypeConversion Source #
Constructors
| TypeConversion | |
Instances
Instances
| Eq Integer Source # | |
| Ord Integer Source # | |
Defined in TreeSitter.Python.AST | |
| Show Integer Source # | |
| Generic Integer Source # | |
| Unmarshal Integer Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Integer | |
| SymbolMatching Integer Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Integer Source # | |
Defined in TreeSitter.Python.AST | |
Instances
| Eq Float Source # | |
| Ord Float Source # | |
| Show Float Source # | |
| Generic Float Source # | |
| Unmarshal Float Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Float | |
| SymbolMatching Float Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Float Source # | |
Defined in TreeSitter.Python.AST | |
newtype Identifier Source #
Constructors
| Identifier | |
Instances
data NonlocalStatement Source #
Constructors
| NonlocalStatement | |
Fields
| |
Instances
data GlobalStatement Source #
Constructors
| GlobalStatement | |
Fields
| |
Instances
data DottedName Source #
Constructors
| DottedName | |
Fields
| |
Instances
data RelativeImport Source #
Constructors
| RelativeImport | |
Fields
| |
Instances
data AliasedImport Source #
Constructors
| AliasedImport | |
Fields
| |
Instances
data ImportStatement Source #
Constructors
| ImportStatement | |
Fields
| |
Instances
data ImportFromStatement Source #
Constructors
| ImportFromStatement | |
Fields
| |
Instances
data FutureImportStatement Source #
Constructors
| FutureImportStatement | |
Fields
| |
Instances
Instances
| Eq True Source # | |
| Ord True Source # | |
| Show True Source # | |
| Generic True Source # | |
| Unmarshal True Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m True | |
| SymbolMatching True Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep True Source # | |
Defined in TreeSitter.Python.AST | |
Instances
| Eq False Source # | |
| Ord False Source # | |
| Show False Source # | |
| Generic False Source # | |
| Unmarshal False Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m False | |
| SymbolMatching False Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep False Source # | |
Defined in TreeSitter.Python.AST | |
Instances
| Eq None Source # | |
| Ord None Source # | |
| Show None Source # | |
| Generic None Source # | |
| Unmarshal None Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m None | |
| SymbolMatching None Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep None Source # | |
Defined in TreeSitter.Python.AST | |
data PrimaryExpression Source #
Constructors
Instances
data UnaryOperator Source #
Constructors
| UnaryOperator | |
Fields | |
Instances
Constructors
| Tuple | |
Fields
| |
Instances
| Eq Tuple Source # | |
| Ord Tuple Source # | |
| Show Tuple Source # | |
| Generic Tuple Source # | |
| Unmarshal Tuple Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Tuple | |
| SymbolMatching Tuple Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Tuple Source # | |
Defined in TreeSitter.Python.AST type Rep Tuple = D1 (MetaData "Tuple" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Tuple" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either Expression Yield]))) | |
Constructors
| Yield | |
Fields
| |
Instances
| Eq Yield Source # | |
| Ord Yield Source # | |
| Show Yield Source # | |
| Generic Yield Source # | |
| Unmarshal Yield Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Yield | |
| SymbolMatching Yield Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Yield Source # | |
Defined in TreeSitter.Python.AST type Rep Yield = D1 (MetaData "Yield" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Yield" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either Expression ExpressionList]))) | |
data ExpressionList Source #
Constructors
| ExpressionList | |
Fields
| |
Instances
data Expression Source #
Constructors
Instances
data NotOperator Source #
Constructors
| NotOperator | |
Fields | |
Instances
data NamedExpression Source #
Constructors
| NamedExpression | |
Fields
| |
Instances
Constructors
| Lambda | |
Fields
| |
Instances
| Eq Lambda Source # | |
| Ord Lambda Source # | |
| Show Lambda Source # | |
| Generic Lambda Source # | |
| Unmarshal Lambda Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Lambda | |
| SymbolMatching Lambda Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Lambda Source # | |
Defined in TreeSitter.Python.AST type Rep Lambda = D1 (MetaData "Lambda" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Lambda" PrefixI True) (S1 (MetaSel (Just "body") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Either Expression Lambda)) :*: S1 (MetaSel (Just "parameters") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe LambdaParameters)))) | |
data LambdaParameters Source #
Constructors
| LambdaParameters | |
Fields | |
Instances
data TypedParameter Source #
Constructors
| TypedParameter | |
Fields
| |
Instances
Constructors
| Type | |
Fields
| |
Instances
| Eq Type Source # | |
| Ord Type Source # | |
| Show Type Source # | |
| Generic Type Source # | |
| Unmarshal Type Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Type | |
| SymbolMatching Type Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Type Source # | |
Defined in TreeSitter.Python.AST type Rep Type = D1 (MetaData "Type" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Type" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
Constructors
| ListSplat | |
Fields
| |
Instances
| Eq ListSplat Source # | |
| Ord ListSplat Source # | |
| Show ListSplat Source # | |
| Generic ListSplat Source # | |
| Unmarshal ListSplat Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m ListSplat | |
| SymbolMatching ListSplat Source # | |
Defined in TreeSitter.Python.AST Methods symbolMatch :: Proxy ListSplat -> Node -> Bool showFailure :: Proxy ListSplat -> Node -> String | |
| type Rep ListSplat Source # | |
Defined in TreeSitter.Python.AST type Rep ListSplat = D1 (MetaData "ListSplat" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "ListSplat" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
data DictionarySplat Source #
Constructors
| DictionarySplat | |
Fields
| |
Instances
data TypedDefaultParameter Source #
Constructors
| TypedDefaultParameter | |
Fields
| |
Instances
data DefaultParameter Source #
Constructors
| DefaultParameter | |
Fields
| |
Instances
data ConditionalExpression Source #
Constructors
| ConditionalExpression | |
Fields
| |
Instances
data ComparisonOperator Source #
Constructors
| ComparisonOperator | |
Fields
| |
Instances
data BooleanOperator Source #
Constructors
| BooleanOperator | |
Fields
| |
Instances
Constructors
| Await | |
Fields
| |
Instances
| Eq Await Source # | |
| Ord Await Source # | |
| Show Await Source # | |
| Generic Await Source # | |
| Unmarshal Await Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Await | |
| SymbolMatching Await Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Await Source # | |
Defined in TreeSitter.Python.AST type Rep Await = D1 (MetaData "Await" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Await" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
Constructors
| Subscript | |
Fields
| |
Instances
| Eq Subscript Source # | |
| Ord Subscript Source # | |
| Show Subscript Source # | |
| Generic Subscript Source # | |
| Unmarshal Subscript Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Subscript | |
| SymbolMatching Subscript Source # | |
Defined in TreeSitter.Python.AST Methods symbolMatch :: Proxy Subscript -> Node -> Bool showFailure :: Proxy Subscript -> Node -> String | |
| type Rep Subscript Source # | |
Defined in TreeSitter.Python.AST type Rep Subscript = D1 (MetaData "Subscript" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Subscript" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either Expression (Either PrimaryExpression Slice)]))) | |
Constructors
| Slice | |
Fields
| |
Instances
| Eq Slice Source # | |
| Ord Slice Source # | |
| Show Slice Source # | |
| Generic Slice Source # | |
| Unmarshal Slice Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Slice | |
| SymbolMatching Slice Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Slice Source # | |
Defined in TreeSitter.Python.AST type Rep Slice = D1 (MetaData "Slice" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Slice" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
Constructors
| String | |
Fields
| |
Instances
| Eq String Source # | |
| Ord String Source # | |
| Show String Source # | |
| Generic String Source # | |
| Unmarshal String Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m String | |
| SymbolMatching String Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep String Source # | |
Defined in TreeSitter.Python.AST type Rep String = D1 (MetaData "String" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "String" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either EscapeSequence Interpolation]))) | |
data Interpolation Source #
Constructors
| Interpolation | |
Fields
| |
Instances
data FormatSpecifier Source #
Constructors
| FormatSpecifier | |
Fields
| |
Instances
data FormatExpression Source #
Constructors
| FormatExpression | |
Fields
| |
Instances
data SetComprehension Source #
Constructors
| SetComprehension | |
Fields
| |
Instances
Constructors
| IfClause | |
Fields
| |
Instances
| Eq IfClause Source # | |
| Ord IfClause Source # | |
Defined in TreeSitter.Python.AST | |
| Show IfClause Source # | |
| Generic IfClause Source # | |
| Unmarshal IfClause Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m IfClause | |
| SymbolMatching IfClause Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep IfClause Source # | |
Defined in TreeSitter.Python.AST type Rep IfClause = D1 (MetaData "IfClause" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "IfClause" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
data ForInClause Source #
Constructors
| ForInClause | |
Fields
| |
Instances
Constructors
| Variables | |
Fields
| |
Instances
| Eq Variables Source # | |
| Ord Variables Source # | |
| Show Variables Source # | |
| Generic Variables Source # | |
| Unmarshal Variables Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Variables | |
| SymbolMatching Variables Source # | |
Defined in TreeSitter.Python.AST Methods symbolMatch :: Proxy Variables -> Node -> Bool showFailure :: Proxy Variables -> Node -> String | |
| type Rep Variables Source # | |
Defined in TreeSitter.Python.AST type Rep Variables = D1 (MetaData "Variables" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Variables" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [PrimaryExpression]))) | |
Constructors
| Set | |
Fields
| |
Instances
| Eq Set Source # | |
| Ord Set Source # | |
| Show Set Source # | |
| Generic Set Source # | |
| Unmarshal Set Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Set | |
| SymbolMatching Set Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Set Source # | |
Defined in TreeSitter.Python.AST type Rep Set = D1 (MetaData "Set" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Set" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either Expression ListSplat]))) | |
data ParenthesizedExpression Source #
Constructors
| ParenthesizedExpression | |
Fields
| |
Instances
data ListComprehension Source #
Constructors
| ListComprehension | |
Fields
| |
Instances
Constructors
| List | |
Fields
| |
Instances
| Eq List Source # | |
| Ord List Source # | |
| Show List Source # | |
| Generic List Source # | |
| Unmarshal List Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m List | |
| SymbolMatching List Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep List Source # | |
Defined in TreeSitter.Python.AST type Rep List = D1 (MetaData "List" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "List" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either Expression ListSplat]))) | |
data GeneratorExpression Source #
Constructors
| GeneratorExpression | |
Fields
| |
Instances
data DictionaryComprehension Source #
Constructors
| DictionaryComprehension | |
Fields
| |
Instances
Constructors
| Pair | |
Fields
| |
Instances
| Eq Pair Source # | |
| Ord Pair Source # | |
| Show Pair Source # | |
| Generic Pair Source # | |
| Unmarshal Pair Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Pair | |
| SymbolMatching Pair Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Pair Source # | |
Defined in TreeSitter.Python.AST type Rep Pair = D1 (MetaData "Pair" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Pair" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
data Dictionary Source #
Constructors
| Dictionary | |
Fields
| |
Instances
data ConcatenatedString Source #
Constructors
| ConcatenatedString | |
Fields
| |
Instances
Constructors
| Call | |
Fields | |
Instances
| Eq Call Source # | |
| Ord Call Source # | |
| Show Call Source # | |
| Generic Call Source # | |
| Unmarshal Call Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Call | |
| SymbolMatching Call Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Call Source # | |
Defined in TreeSitter.Python.AST type Rep Call = D1 (MetaData "Call" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Call" PrefixI True) (S1 (MetaSel (Just "function") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 PrimaryExpression) :*: S1 (MetaSel (Just "arguments") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Either ArgumentList GeneratorExpression)))) | |
data ArgumentList Source #
Constructors
| ArgumentList | |
Fields
| |
Instances
data KeywordArgument Source #
Constructors
| KeywordArgument | |
Fields
| |
Instances
data BinaryOperator Source #
Constructors
Instances
Constructors
| Attribute | |
Fields
| |
Instances
| Eq Attribute Source # | |
| Ord Attribute Source # | |
| Show Attribute Source # | |
| Generic Attribute Source # | |
| Unmarshal Attribute Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Attribute | |
| SymbolMatching Attribute Source # | |
Defined in TreeSitter.Python.AST Methods symbolMatch :: Proxy Attribute -> Node -> Bool showFailure :: Proxy Attribute -> Node -> String | |
| type Rep Attribute Source # | |
Defined in TreeSitter.Python.AST type Rep Attribute = D1 (MetaData "Attribute" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Attribute" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either PrimaryExpression Identifier]))) | |
Constructors
| WithItem | |
Fields
| |
Instances
| Eq WithItem Source # | |
| Ord WithItem Source # | |
Defined in TreeSitter.Python.AST | |
| Show WithItem Source # | |
| Generic WithItem Source # | |
| Unmarshal WithItem Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m WithItem | |
| SymbolMatching WithItem Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep WithItem Source # | |
Defined in TreeSitter.Python.AST type Rep WithItem = D1 (MetaData "WithItem" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "WithItem" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
data ReturnStatement Source #
Constructors
| ReturnStatement | |
Fields
| |
Instances
data RaiseStatement Source #
Constructors
| RaiseStatement | |
Fields
| |
Instances
data DeleteStatement Source #
Constructors
| DeleteStatement | |
Fields
| |
Instances
data Assignment Source #
Constructors
| Assignment | |
Fields
| |
Instances
data AugmentedAssignment Source #
Constructors
| AugmentedAssignment | |
Fields | |
Instances
data ExpressionStatement Source #
Constructors
| ExpressionStatement | |
Fields
| |
Instances
data ExecStatement Source #
Constructors
| ExecStatement | |
Fields
| |
Instances
data Parameters Source #
Constructors
| Parameters | |
Fields | |
Instances
Constructors
| Chevron | |
Fields
| |
Instances
| Eq Chevron Source # | |
| Ord Chevron Source # | |
Defined in TreeSitter.Python.AST | |
| Show Chevron Source # | |
| Generic Chevron Source # | |
| Unmarshal Chevron Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Chevron | |
| SymbolMatching Chevron Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Chevron Source # | |
Defined in TreeSitter.Python.AST type Rep Chevron = D1 (MetaData "Chevron" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Chevron" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Expression]))) | |
data PrintStatement Source #
Constructors
| PrintStatement | |
Fields
| |
Instances
data AssertStatement Source #
Constructors
| AssertStatement | |
Fields
| |
Instances
data SimpleStatement Source #
Constructors
Instances
Constructors
| Decorator | |
Fields
| |
Instances
| Eq Decorator Source # | |
| Ord Decorator Source # | |
| Show Decorator Source # | |
| Generic Decorator Source # | |
| Unmarshal Decorator Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Decorator | |
| SymbolMatching Decorator Source # | |
Defined in TreeSitter.Python.AST Methods symbolMatch :: Proxy Decorator -> Node -> Bool showFailure :: Proxy Decorator -> Node -> String | |
| type Rep Decorator Source # | |
Defined in TreeSitter.Python.AST type Rep Decorator = D1 (MetaData "Decorator" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Decorator" PrefixI True) (S1 (MetaSel (Just "extraChildren") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either ArgumentList DottedName]))) | |
data ClassDefinition Source #
Constructors
| ClassDefinition | |
Fields
| |
Instances
Constructors
| Block | |
Fields
| |
Instances
| Eq Block Source # | |
| Ord Block Source # | |
| Show Block Source # | |
| Generic Block Source # | |
| Unmarshal Block Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Block | |
| SymbolMatching Block Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Block Source # | |
Defined in TreeSitter.Python.AST type Rep Block = D1 (MetaData "Block" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Block" PrefixI True) (S1 (MetaSel (Just "statement") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either CompoundStatement SimpleStatement]))) | |
data CompoundStatement Source #
Constructors
Instances
data WithStatement Source #
Constructors
| WithStatement | |
Fields
| |
Instances
data WhileStatement Source #
Constructors
| WhileStatement | |
Fields
| |
Instances
data ElseClause Source #
Constructors
| ElseClause | |
Instances
data TryStatement Source #
Constructors
| TryStatement | |
Fields
| |
Instances
data FinallyClause Source #
Constructors
| FinallyClause | |
Fields
| |
Instances
data ExceptClause Source #
Constructors
| ExceptClause | |
Fields
| |
Instances
data IfStatement Source #
Constructors
| IfStatement | |
Fields
| |
Instances
data ElifClause Source #
Constructors
| ElifClause | |
Fields
| |
Instances
data FunctionDefinition Source #
Constructors
| FunctionDefinition | |
Fields
| |
Instances
data ForStatement Source #
Constructors
| ForStatement | |
Fields
| |
Instances
data DecoratedDefinition Source #
Constructors
| DecoratedDefinition | |
Fields
| |
Instances
Constructors
| Module | |
Fields
| |
Instances
| Eq Module Source # | |
| Ord Module Source # | |
| Show Module Source # | |
| Generic Module Source # | |
| Unmarshal Module Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Module | |
| SymbolMatching Module Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Module Source # | |
Defined in TreeSitter.Python.AST type Rep Module = D1 (MetaData "Module" "TreeSitter.Python.AST" "tree-sitter-python-0.2.0.0-inplace" False) (C1 (MetaCons "Module" PrefixI True) (S1 (MetaSel (Just "statement") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Either CompoundStatement SimpleStatement]))) | |
data AnonymousAwait Source #
Constructors
| AnonymousAwait |
Instances
Instances
| Eq Comment Source # | |
| Ord Comment Source # | |
Defined in TreeSitter.Python.AST | |
| Show Comment Source # | |
| Generic Comment Source # | |
| Unmarshal Comment Source # | |
Defined in TreeSitter.Python.AST Methods unmarshalNodes :: (MonadFail m, Carrier sig m, Member (Reader ByteString) sig, Member (Reader (Ptr Cursor)) sig, MonadIO m) => [Node] -> m Comment | |
| SymbolMatching Comment Source # | |
Defined in TreeSitter.Python.AST | |
| type Rep Comment Source # | |
Defined in TreeSitter.Python.AST | |