SyntaxFactory Class

Definition

public ref class SyntaxFactory
public class SyntaxFactory
type SyntaxFactory = class
Public Class SyntaxFactory
Inheritance
SyntaxFactory

Constructors

SyntaxFactory()

Properties

CarriageReturn

A trivia with kind EndOfLineTrivia containing a single carriage return character.

CarriageReturnLineFeed

A trivia with kind EndOfLineTrivia containing both the carriage return And line feed characters.

ElasticCarriageReturn

An elastic trivia with kind EndOfLineTrivia containing a single carriage return character. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

ElasticCarriageReturnLineFeed

An elastic trivia with kind EndOfLineTrivia containing both the carriage return And line feed characters. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

ElasticLineFeed

An elastic trivia with kind EndOfLineTrivia containing a single line feed character. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

ElasticMarker

An elastic trivia with kind WhitespaceTrivia containing no characters. Elastic marker trivia are included automatically by factory methods when trivia Is Not specified. Syntax formatting will replace elastic markers with appropriate trivia.

ElasticSpace

An elastic trivia with kind WhitespaceTrivia containing a single space character. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

ElasticTab

An elastic trivia with kind WhitespaceTrivia containing a single tab character. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

LineFeed

A trivia with kind EndOfLineTrivia containing a single line feed character.

Space

A trivia with kind WhitespaceTrivia containing a single space character.

Tab

A trivia with kind WhitespaceTrivia containing a single tab character.

Methods

AccessorBlock(SyntaxKind, AccessorStatementSyntax, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

AccessorBlock(SyntaxKind, AccessorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

AccessorStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

AccessorStatement(SyntaxKind, SyntaxToken)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

AddAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

AddAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

AddExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

AddExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

AddHandlerAccessorBlock(AccessorStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

AddHandlerAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

AddHandlerAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

AddHandlerAccessorStatement()

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

AddHandlerAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

AddHandlerAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

AddHandlerStatement(ExpressionSyntax, ExpressionSyntax)

Represents an AddHandler or RemoveHandler statement. The Kind property determines which one.

AddHandlerStatement(SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents an AddHandler or RemoveHandler statement. The Kind property determines which one.

AddRemoveHandlerStatement(SyntaxKind, SyntaxToken, ExpressionSyntax, ExpressionSyntax)

Represents an AddHandler or RemoveHandler statement. The Kind property determines which one.

AddRemoveHandlerStatement(SyntaxKind, SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents an AddHandler or RemoveHandler statement. The Kind property determines which one.

AddressOfExpression(ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

AddressOfExpression(SyntaxToken, ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

AggregateClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents an Aggregate query operator.

AggregateClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>, SyntaxList<QueryClauseSyntax>, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents an Aggregate query operator.

AggregateClause(SyntaxToken, SeparatedSyntaxList<CollectionRangeVariableSyntax>, SyntaxList<QueryClauseSyntax>, SyntaxToken, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents an Aggregate query operator.

AggregationRangeVariable(AggregationSyntax)

Describes a single variable of the form "[x [As Type] =] aggregation-function" for use in the Into clause of Aggregate or Group By or Group Join query operators.

AggregationRangeVariable(VariableNameEqualsSyntax, AggregationSyntax)

Describes a single variable of the form "[x [As Type] =] aggregation-function" for use in the Into clause of Aggregate or Group By or Group Join query operators.

AndAlsoExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

AndAlsoExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

AndExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

AndExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

AnonymousObjectCreationExpression(ObjectMemberInitializerSyntax)

Represents a New expression that create an object of anonymous type.

AnonymousObjectCreationExpression(SyntaxList<AttributeListSyntax>, ObjectMemberInitializerSyntax)

Represents a New expression that create an object of anonymous type.

AnonymousObjectCreationExpression(SyntaxToken, SyntaxList<AttributeListSyntax>, ObjectMemberInitializerSyntax)

Represents a New expression that create an object of anonymous type.

AreEquivalent(SyntaxNode, SyntaxNode, Boolean)

Determines if two syntax nodes are the same, disregarding trivia differences.

AreEquivalent(SyntaxNode, SyntaxNode, Func<SyntaxKind,Boolean>)

Determines if two syntax nodes are the same, disregarding trivia differences.

AreEquivalent(SyntaxToken, SyntaxToken)

Determines if two syntax tokens are the same, disregarding trivia differences.

AreEquivalent(SyntaxTokenList, SyntaxTokenList)

Determines if two lists of tokens are the same, disregarding trivia differences.

AreEquivalent(SyntaxTree, SyntaxTree, Boolean)

Determines if two trees are the same, disregarding trivia differences.

AreEquivalent<TNode>(SeparatedSyntaxList<TNode>, SeparatedSyntaxList<TNode>, Func<SyntaxKind,Boolean>)

Determines if two lists of syntax nodes are the same, disregarding trivia differences.

AreEquivalent<TNode>(SyntaxList<TNode>, SyntaxList<TNode>, Func<SyntaxKind,Boolean>)

Determines if two lists of syntax nodes are the same, disregarding trivia differences.

ArgumentList()

Represents a parenthesized argument list.

ArgumentList(SeparatedSyntaxList<ArgumentSyntax>)

Represents a parenthesized argument list.

ArgumentList(SyntaxToken, SeparatedSyntaxList<ArgumentSyntax>, SyntaxToken)

Represents a parenthesized argument list.

ArrayCreationExpression(SyntaxList<AttributeListSyntax>, TypeSyntax, ArgumentListSyntax, CollectionInitializerSyntax)

Represents an expression that creates a new array.

ArrayCreationExpression(SyntaxToken, SyntaxList<AttributeListSyntax>, TypeSyntax, ArgumentListSyntax, SyntaxList<ArrayRankSpecifierSyntax>, CollectionInitializerSyntax)

Represents an expression that creates a new array.

ArrayCreationExpression(TypeSyntax, CollectionInitializerSyntax)

Represents an expression that creates a new array.

ArrayRankSpecifier()

Represents a modifier that describes an array type, without bounds, such as "()" or "(,)".

ArrayRankSpecifier(SyntaxToken, SyntaxTokenList, SyntaxToken)

Represents a modifier that describes an array type, without bounds, such as "()" or "(,)".

ArrayType(TypeSyntax)

Represents an array type, such as "A() or "A(,)", without bounds specified for the array.

ArrayType(TypeSyntax, SyntaxList<ArrayRankSpecifierSyntax>)

Represents an array type, such as "A() or "A(,)", without bounds specified for the array.

AscendingOrdering(ExpressionSyntax)

An expression to order by, plus an optional ordering. The Kind indicates whether to order in ascending or descending order.

AscendingOrdering(ExpressionSyntax, SyntaxToken)

An expression to order by, plus an optional ordering. The Kind indicates whether to order in ascending or descending order.

AsNewClause(NewExpressionSyntax)

Represents an "As New {type-name} [arguments] [initializers]" clause in a declaration. The type has optional attributes associated with it, although attributes are not permitted in many places where this node occurs (they are permitted, for example, on automatically implemented properties.)

AsNewClause(SyntaxToken, NewExpressionSyntax)

Represents an "As New {type-name} [arguments] [initializers]" clause in a declaration. The type has optional attributes associated with it, although attributes are not permitted in many places where this node occurs (they are permitted, for example, on automatically implemented properties.)

AssignmentStatement(SyntaxKind, ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

Attribute(AttributeTargetSyntax, TypeSyntax, ArgumentListSyntax)

Represents a single attribute declaration within an attribute list.

Attribute(TypeSyntax)

Represents a single attribute declaration within an attribute list.

AttributeList()

Represents a group of attributes within "<" and ">" brackets.

AttributeList(SeparatedSyntaxList<AttributeSyntax>)

Represents a group of attributes within "<" and ">" brackets.

AttributeList(SyntaxToken, SeparatedSyntaxList<AttributeSyntax>, SyntaxToken)

Represents a group of attributes within "<" and ">" brackets.

AttributesStatement()

Represents a file-level attribute, in which the attributes have no other syntactic element they are attached to.

AttributesStatement(SyntaxList<AttributeListSyntax>)

Represents a file-level attribute, in which the attributes have no other syntactic element they are attached to.

AttributeTarget(SyntaxToken)

Represents a single attribute declaration within an attribute list.

AttributeTarget(SyntaxToken, SyntaxToken)

Represents a single attribute declaration within an attribute list.

AwaitExpression(ExpressionSyntax)

Represents an Await expression.

AwaitExpression(SyntaxToken, ExpressionSyntax)

Represents an Await expression.

BadDirectiveTrivia()

Represents an unrecognized pre-processing directive. This occurs when the parser encounters a hash '#' token at the beginning of a physical line but does recognize the text that follows as a valid Visual Basic pre-processing directive.

BadDirectiveTrivia(SyntaxToken)

Represents an unrecognized pre-processing directive. This occurs when the parser encounters a hash '#' token at the beginning of a physical line but does recognize the text that follows as a valid Visual Basic pre-processing directive.

BadToken(String)
BadToken(SyntaxTriviaList, String, SyntaxTriviaList)
BinaryConditionalExpression(ExpressionSyntax, ExpressionSyntax)

Represents a conditional expression, If(condition, true-expr, false-expr) or If(expr, nothing-expr).

BinaryConditionalExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents a conditional expression, If(condition, true-expr, false-expr) or If(expr, nothing-expr).

BinaryExpression(SyntaxKind, ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

BracketedIdentifier(String)

Create a bracketed identifier.

BracketedIdentifier(SyntaxTriviaList, String, SyntaxTriviaList)

Create a bracketed identifier.

CallStatement(ExpressionSyntax)

Represent a call statement (also known as a invocation statement).

CallStatement(SyntaxToken, ExpressionSyntax)

Represent a call statement (also known as a invocation statement).

CaseBlock(CaseStatementSyntax)

Represents a case statement and its subsequent block.

CaseBlock(CaseStatementSyntax, SyntaxList<StatementSyntax>)

Represents a case statement and its subsequent block.

CaseBlock(SyntaxKind, CaseStatementSyntax)

Represents a case statement and its subsequent block.

CaseBlock(SyntaxKind, CaseStatementSyntax, SyntaxList<StatementSyntax>)

Represents a case statement and its subsequent block.

CaseElseBlock(CaseStatementSyntax)

Represents a case statement and its subsequent block.

CaseElseBlock(CaseStatementSyntax, SyntaxList<StatementSyntax>)

Represents a case statement and its subsequent block.

CaseElseStatement(CaseClauseSyntax[])

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseElseStatement(SeparatedSyntaxList<CaseClauseSyntax>)

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseElseStatement(SyntaxToken, SeparatedSyntaxList<CaseClauseSyntax>)

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseEqualsClause(ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseEqualsClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseGreaterThanClause(ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseGreaterThanClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseGreaterThanOrEqualClause(ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseGreaterThanOrEqualClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseLessThanClause(ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseLessThanClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseLessThanOrEqualClause(ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseLessThanOrEqualClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseNotEqualsClause(ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseNotEqualsClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

CaseStatement(CaseClauseSyntax[])

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseStatement(SeparatedSyntaxList<CaseClauseSyntax>)

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseStatement(SyntaxKind, CaseClauseSyntax[])

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseStatement(SyntaxKind, SeparatedSyntaxList<CaseClauseSyntax>)

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseStatement(SyntaxKind, SyntaxToken, SeparatedSyntaxList<CaseClauseSyntax>)

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CaseStatement(SyntaxToken, SeparatedSyntaxList<CaseClauseSyntax>)

Represents a Case or Case Else statement. This statement is always the Begin of a CaseBlock. If this is a Case Else statement, the Kind=CaseElse, otherwise the Kind=Case.

CatchBlock(CatchStatementSyntax)

Represents a "Catch ..." block.

CatchBlock(CatchStatementSyntax, SyntaxList<StatementSyntax>)

Represents a "Catch ..." block.

CatchFilterClause(ExpressionSyntax)

Represents the "When ..." clause of a "Catch" statement.

CatchFilterClause(SyntaxToken, ExpressionSyntax)

Represents the "When ..." clause of a "Catch" statement.

CatchStatement()

Represents the "Catch ... When ..." statement that begins a "Catch" block.

CatchStatement(IdentifierNameSyntax, SimpleAsClauseSyntax, CatchFilterClauseSyntax)

Represents the "Catch ... When ..." statement that begins a "Catch" block.

CatchStatement(SyntaxToken, IdentifierNameSyntax, SimpleAsClauseSyntax, CatchFilterClauseSyntax)

Represents the "Catch ... When ..." statement that begins a "Catch" block.

CharacterLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

CharacterLiteralToken(String, Char)

Represents a string literal token.

CharacterLiteralToken(SyntaxTriviaList, String, Char, SyntaxTriviaList)

Represents a string literal token.

ClassBlock(ClassStatementSyntax)

Represents a declaration of a Class its contents and the End statement that ends it.

ClassBlock(ClassStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>)

Represents a declaration of a Class its contents and the End statement that ends it.

ClassBlock(ClassStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a declaration of a Class its contents and the End statement that ends it.

ClassConstraint(SyntaxToken)

One of the special type parameter constraints: New, Class or Structure. Which kind of special constraint it is can be obtained from the Kind property and is one of: NewConstraint, ReferenceConstraint or ValueConstraint.

ClassStatement(String)

Represents the beginning statement of a Class declaration. This node always appears as the Begin of a TypeBlock with Kind=ClassDeclarationBlock.

ClassStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Class declaration. This node always appears as the Begin of a TypeBlock with Kind=ClassDeclarationBlock.

ClassStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Class declaration. This node always appears as the Begin of a TypeBlock with Kind=ClassDeclarationBlock.

ClassStatement(SyntaxToken)

Represents the beginning statement of a Class declaration. This node always appears as the Begin of a TypeBlock with Kind=ClassDeclarationBlock.

CollectionInitializer()

Represents an expression that creates a new array without naming the element type.

CollectionInitializer(SeparatedSyntaxList<ExpressionSyntax>)

Represents an expression that creates a new array without naming the element type.

CollectionInitializer(SyntaxToken, SeparatedSyntaxList<ExpressionSyntax>, SyntaxToken)

Represents an expression that creates a new array without naming the element type.

CollectionRangeVariable(ModifiedIdentifierSyntax, ExpressionSyntax)

Describes a single variable of the form "x [As Type] In expression" for use in query expressions.

CollectionRangeVariable(ModifiedIdentifierSyntax, SimpleAsClauseSyntax, ExpressionSyntax)

Describes a single variable of the form "x [As Type] In expression" for use in query expressions.

CollectionRangeVariable(ModifiedIdentifierSyntax, SimpleAsClauseSyntax, SyntaxToken, ExpressionSyntax)

Describes a single variable of the form "x [As Type] In expression" for use in query expressions.

ColonTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

CommentTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

CompilationUnit()

Represents an entire source file of VB code.

CompilationUnit(SyntaxList<OptionStatementSyntax>, SyntaxList<ImportsStatementSyntax>, SyntaxList<AttributesStatementSyntax>, SyntaxList<StatementSyntax>)

Represents an entire source file of VB code.

CompilationUnit(SyntaxList<OptionStatementSyntax>, SyntaxList<ImportsStatementSyntax>, SyntaxList<AttributesStatementSyntax>, SyntaxList<StatementSyntax>, SyntaxToken)

Represents an entire source file of VB code.

ConcatenateAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

ConcatenateAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

ConcatenateExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ConcatenateExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ConditionalAccessExpression(ExpressionSyntax)

ExpressionSyntax node representing the object conditionally accessed.

ConditionalAccessExpression(ExpressionSyntax, ExpressionSyntax)

ExpressionSyntax node representing the object conditionally accessed.

ConditionalAccessExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

ExpressionSyntax node representing the object conditionally accessed.

ConflictMarkerTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

ConstDirectiveTrivia(String, ExpressionSyntax)

Represents a #Const pre-processing constant declaration appearing in source.

ConstDirectiveTrivia(SyntaxToken, ExpressionSyntax)

Represents a #Const pre-processing constant declaration appearing in source.

ConstDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a #Const pre-processing constant declaration appearing in source.

ConstructorBlock(SubNewStatementSyntax)

Represents a constructor block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

ConstructorBlock(SubNewStatementSyntax, SyntaxList<StatementSyntax>)

Represents a constructor block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

ConstructorBlock(SubNewStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a constructor block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

ContinueDoStatement()

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueDoStatement(SyntaxToken, SyntaxToken)

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueForStatement()

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueForStatement(SyntaxToken, SyntaxToken)

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueStatement(SyntaxKind, SyntaxToken)

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueStatement(SyntaxKind, SyntaxToken, SyntaxToken)

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueWhileStatement()

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

ContinueWhileStatement(SyntaxToken, SyntaxToken)

Represents a "Continue (block)" statement. THe kind of block referenced can be determined by examining the Kind.

CrefOperatorReference(SyntaxToken)
CrefOperatorReference(SyntaxToken, SyntaxToken)
CrefReference(TypeSyntax)

Syntax node class that represents a value of 'cref' attribute inside documentation comment trivia.

CrefReference(TypeSyntax, CrefSignatureSyntax, SimpleAsClauseSyntax)

Syntax node class that represents a value of 'cref' attribute inside documentation comment trivia.

CrefSignature(CrefSignaturePartSyntax[])

Represents a parenthesized list of argument types for a signature inside CrefReferenceSyntax syntax.

CrefSignature(SeparatedSyntaxList<CrefSignaturePartSyntax>)

Represents a parenthesized list of argument types for a signature inside CrefReferenceSyntax syntax.

CrefSignature(SyntaxToken, SeparatedSyntaxList<CrefSignaturePartSyntax>, SyntaxToken)

Represents a parenthesized list of argument types for a signature inside CrefReferenceSyntax syntax.

CrefSignaturePart()
CrefSignaturePart(SyntaxToken, TypeSyntax)
CTypeExpression(ExpressionSyntax, TypeSyntax)
CTypeExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken, TypeSyntax, SyntaxToken)
DateLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

DateLiteralToken(String, DateTime)

Represents a Date literal token.

DateLiteralToken(SyntaxTriviaList, String, DateTime, SyntaxTriviaList)

Represents a Date literal token.

DecimalLiteralToken(String, TypeCharacter, Decimal)

Represents a Decimal literal token.

DecimalLiteralToken(SyntaxTriviaList, String, TypeCharacter, Decimal, SyntaxTriviaList)

Represents a Decimal literal token.

DeclareFunctionStatement(String, LiteralExpressionSyntax)

A Declare statement that declares an external DLL method.

DeclareFunctionStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, LiteralExpressionSyntax, LiteralExpressionSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A Declare statement that declares an external DLL method.

DeclareFunctionStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LiteralExpressionSyntax, SyntaxToken, LiteralExpressionSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A Declare statement that declares an external DLL method.

DeclareFunctionStatement(SyntaxToken, LiteralExpressionSyntax)

A Declare statement that declares an external DLL method.

DeclareStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, LiteralExpressionSyntax, LiteralExpressionSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A Declare statement that declares an external DLL method.

DeclareStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LiteralExpressionSyntax, SyntaxToken, LiteralExpressionSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A Declare statement that declares an external DLL method.

DeclareStatement(SyntaxKind, SyntaxToken, String, LiteralExpressionSyntax)

A Declare statement that declares an external DLL method.

DeclareStatement(SyntaxKind, SyntaxToken, SyntaxToken, LiteralExpressionSyntax)

A Declare statement that declares an external DLL method.

DeclareSubStatement(String, LiteralExpressionSyntax)

A Declare statement that declares an external DLL method.

DeclareSubStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, LiteralExpressionSyntax, LiteralExpressionSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A Declare statement that declares an external DLL method.

DeclareSubStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LiteralExpressionSyntax, SyntaxToken, LiteralExpressionSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A Declare statement that declares an external DLL method.

DeclareSubStatement(SyntaxToken, LiteralExpressionSyntax)

A Declare statement that declares an external DLL method.

DelegateFunctionStatement(String)

A statement that declares a delegate type.

DelegateFunctionStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares a delegate type.

DelegateFunctionStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares a delegate type.

DelegateFunctionStatement(SyntaxToken)

A statement that declares a delegate type.

DelegateStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares a delegate type.

DelegateStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares a delegate type.

DelegateStatement(SyntaxKind, SyntaxToken, String)

A statement that declares a delegate type.

DelegateStatement(SyntaxKind, SyntaxToken, SyntaxToken)

A statement that declares a delegate type.

DelegateSubStatement(String)

A statement that declares a delegate type.

DelegateSubStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares a delegate type.

DelegateSubStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares a delegate type.

DelegateSubStatement(SyntaxToken)

A statement that declares a delegate type.

DescendingOrdering(ExpressionSyntax)

An expression to order by, plus an optional ordering. The Kind indicates whether to order in ascending or descending order.

DescendingOrdering(ExpressionSyntax, SyntaxToken)

An expression to order by, plus an optional ordering. The Kind indicates whether to order in ascending or descending order.

DictionaryAccessExpression(ExpressionSyntax, SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

DictionaryAccessExpression(ExpressionSyntax, SyntaxToken, SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

DictionaryAccessExpression(SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

DirectCastExpression(ExpressionSyntax, TypeSyntax)
DirectCastExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken, TypeSyntax, SyntaxToken)
DisabledTextTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

DisableWarningDirectiveTrivia(IdentifierNameSyntax[])

Represents #Disable Warning pre-processing directive appearing in source.

DisableWarningDirectiveTrivia(SeparatedSyntaxList<IdentifierNameSyntax>)

Represents #Disable Warning pre-processing directive appearing in source.

DisableWarningDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, SeparatedSyntaxList<IdentifierNameSyntax>)

Represents #Disable Warning pre-processing directive appearing in source.

DistinctClause()

Represents the "Distinct" query operator.

DistinctClause(SyntaxToken)

Represents the "Distinct" query operator.

DivideAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

DivideAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

DivideExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

DivideExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

DocumentationComment(XmlNodeSyntax[])

Creates an xml documentation comment that abstracts xml syntax creation.

DocumentationCommentExteriorTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

DocumentationCommentLineBreakToken(String, String)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

DocumentationCommentLineBreakToken(SyntaxTriviaList, String, String, SyntaxTriviaList)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

DocumentationCommentTrivia()

Represents a documentation comment e.g. ''' <Summary> appearing in source.

DocumentationCommentTrivia(SyntaxList<XmlNodeSyntax>)

Represents a documentation comment e.g. ''' <Summary> appearing in source.

DoLoopBlock(SyntaxKind, DoStatementSyntax, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoLoopBlock(SyntaxKind, DoStatementSyntax, SyntaxList<StatementSyntax>, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoLoopUntilBlock(DoStatementSyntax, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoLoopUntilBlock(DoStatementSyntax, SyntaxList<StatementSyntax>, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoLoopWhileBlock(DoStatementSyntax, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoLoopWhileBlock(DoStatementSyntax, SyntaxList<StatementSyntax>, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoStatement(SyntaxKind)

The Do statement that begins a Do-Loop block.

DoStatement(SyntaxKind, SyntaxToken, WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

DoStatement(SyntaxKind, WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

DoUntilLoopBlock(DoStatementSyntax, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoUntilLoopBlock(DoStatementSyntax, SyntaxList<StatementSyntax>, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoUntilStatement()

The Do statement that begins a Do-Loop block.

DoUntilStatement(SyntaxToken, WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

DoUntilStatement(WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

DoWhileLoopBlock(DoStatementSyntax, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoWhileLoopBlock(DoStatementSyntax, SyntaxList<StatementSyntax>, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

DoWhileStatement()

The Do statement that begins a Do-Loop block.

DoWhileStatement(SyntaxToken, WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

DoWhileStatement(WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

ElasticEndOfLine(String)

Creates a trivia with kind EndOfLineTrivia containing the specified text. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

ElasticWhitespace(String)

Creates a trivia with kind WhitespaceTrivia containing the specified text. Elastic trivia are used to denote trivia that was Not produced by parsing source text, And are usually Not preserved during formatting.

ElseBlock()

Represents an "Else ..." block.

ElseBlock(ElseStatementSyntax, SyntaxList<StatementSyntax>)

Represents an "Else ..." block.

ElseBlock(SyntaxList<StatementSyntax>)

Represents an "Else ..." block.

ElseCaseClause()

The "Else" part in a Case Else statement.

ElseCaseClause(SyntaxToken)

The "Else" part in a Case Else statement.

ElseDirectiveTrivia()

Represents an #Else pre-processing directive appearing in source.

ElseDirectiveTrivia(SyntaxToken, SyntaxToken)

Represents an #Else pre-processing directive appearing in source.

ElseIfBlock(ElseIfStatementSyntax)

Represents an "ElseIf ... Then ..." block.

ElseIfBlock(ElseIfStatementSyntax, SyntaxList<StatementSyntax>)

Represents an "ElseIf ... Then ..." block.

ElseIfDirectiveTrivia(SyntaxToken, ExpressionSyntax)

Represents the beginning of an #If pre-processing directive appearing in source.

ElseIfDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents the beginning of an #If pre-processing directive appearing in source.

ElseIfStatement(ExpressionSyntax)

Represents the "ElseIf ... Then" statement that begins an "ElseIf" block.

ElseIfStatement(SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents the "ElseIf ... Then" statement that begins an "ElseIf" block.

ElseStatement()

Represents the "Else" statement that begins an "Else" block.

ElseStatement(SyntaxToken)

Represents the "Else" statement that begins an "Else" block.

EmptyStatement()

A class to represent an empty statement. This can occur when a colon is on a line without anything else.

EmptyStatement(SyntaxToken)

A class to represent an empty statement. This can occur when a colon is on a line without anything else.

EnableWarningDirectiveTrivia(IdentifierNameSyntax[])

Represents #Enable Warning pre-processing directive appearing in source.

EnableWarningDirectiveTrivia(SeparatedSyntaxList<IdentifierNameSyntax>)

Represents #Enable Warning pre-processing directive appearing in source.

EnableWarningDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, SeparatedSyntaxList<IdentifierNameSyntax>)

Represents #Enable Warning pre-processing directive appearing in source.

EndAddHandlerStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndAddHandlerStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndBlockStatement(SyntaxKind, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndBlockStatement(SyntaxKind, SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndClassStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndClassStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndEnumStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndEnumStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndEventStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndEventStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndExternalSourceDirectiveTrivia()

Represents an #End ExternalSource pre-processing directive appearing in source.

EndExternalSourceDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken)

Represents an #End ExternalSource pre-processing directive appearing in source.

EndFunctionStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndFunctionStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndGetStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndGetStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndIfDirectiveTrivia()

Represents an #End If pre-processing directive appearing in source.

EndIfDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken)

Represents an #End If pre-processing directive appearing in source.

EndIfStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndIfStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndInterfaceStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndInterfaceStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndModuleStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndModuleStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndNamespaceStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndNamespaceStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndOfLine(String)

Creates a trivia with kind EndOfLineTrivia containing the specified text.

EndOfLine(String, Boolean)
EndOfLineTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

EndOperatorStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndOperatorStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndPropertyStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndPropertyStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndRaiseEventStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndRaiseEventStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndRegionDirectiveTrivia()

Represents an #End Region directive appearing in source.

EndRegionDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken)

Represents an #End Region directive appearing in source.

EndRemoveHandlerStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndRemoveHandlerStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndSelectStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndSelectStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndSetStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndSetStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndStatement(SyntaxToken)

Represents a "Stop" or "End" statement. The Kind can be used to determine which kind of statement this is.

EndStructureStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndStructureStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndSubStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndSubStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndSyncLockStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndSyncLockStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndTryStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndTryStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndUsingStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndUsingStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndWhileStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndWhileStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EndWithStatement()

Represents an "End XXX" statement, where XXX is a single keyword.

EndWithStatement(SyntaxToken, SyntaxToken)

Represents an "End XXX" statement, where XXX is a single keyword.

EnumBlock(EnumStatementSyntax)

Represents a declaration of an Enum, its contents and the End Enum statement that ends it.

EnumBlock(EnumStatementSyntax, SyntaxList<StatementSyntax>)

Represents a declaration of an Enum, its contents and the End Enum statement that ends it.

EnumBlock(EnumStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a declaration of an Enum, its contents and the End Enum statement that ends it.

EnumMemberDeclaration(String)

Represents a name and value in an EnumDeclarationBlock.

EnumMemberDeclaration(SyntaxList<AttributeListSyntax>, SyntaxToken, EqualsValueSyntax)

Represents a name and value in an EnumDeclarationBlock.

EnumMemberDeclaration(SyntaxToken)

Represents a name and value in an EnumDeclarationBlock.

EnumStatement(String)

Represents the beginning statement of an Enum declaration. This node always appears as the Begin of an EnumBlock with Kind=EnumDeclarationBlock.

EnumStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, AsClauseSyntax)

Represents the beginning statement of an Enum declaration. This node always appears as the Begin of an EnumBlock with Kind=EnumDeclarationBlock.

EnumStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, AsClauseSyntax)

Represents the beginning statement of an Enum declaration. This node always appears as the Begin of an EnumBlock with Kind=EnumDeclarationBlock.

EnumStatement(SyntaxToken)

Represents the beginning statement of an Enum declaration. This node always appears as the Begin of an EnumBlock with Kind=EnumDeclarationBlock.

EqualsExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

EqualsExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

EqualsValue(ExpressionSyntax)

Represents an "= initializer" clause in a declaration for a variable, parameter or automatic property.

EqualsValue(SyntaxToken, ExpressionSyntax)

Represents an "= initializer" clause in a declaration for a variable, parameter or automatic property.

EraseStatement(ExpressionSyntax[])

Represents an "Erase" statement.

EraseStatement(SeparatedSyntaxList<ExpressionSyntax>)

Represents an "Erase" statement.

EraseStatement(SyntaxToken, SeparatedSyntaxList<ExpressionSyntax>)

Represents an "Erase" statement.

ErrorStatement(ExpressionSyntax)

Represents the "Error" statement.

ErrorStatement(SyntaxToken, ExpressionSyntax)

Represents the "Error" statement.

EventBlock(EventStatementSyntax, SyntaxList<AccessorBlockSyntax>)

Represents a custom event declaration: A declaration that has a beginning event declaration, some accessor blocks and an end statement.

EventBlock(EventStatementSyntax, SyntaxList<AccessorBlockSyntax>, EndBlockStatementSyntax)

Represents a custom event declaration: A declaration that has a beginning event declaration, some accessor blocks and an end statement.

EventStatement(String)

A statement that declares an event. If the event being declared is a custom event, this statement will be the Begin of a PropertyOrEventBlock, and the accessors will be part of the Accessors of that node.

EventStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax, ImplementsClauseSyntax)

A statement that declares an event. If the event being declared is a custom event, this statement will be the Begin of a PropertyOrEventBlock, and the accessors will be part of the Accessors of that node.

EventStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax, ImplementsClauseSyntax)

A statement that declares an event. If the event being declared is a custom event, this statement will be the Begin of a PropertyOrEventBlock, and the accessors will be part of the Accessors of that node.

EventStatement(SyntaxToken)

A statement that declares an event. If the event being declared is a custom event, this statement will be the Begin of a PropertyOrEventBlock, and the accessors will be part of the Accessors of that node.

ExclusiveOrExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ExclusiveOrExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ExitDoStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitDoStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitForStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitForStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitFunctionStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitFunctionStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitOperatorStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitOperatorStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitPropertyStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitPropertyStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitSelectStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitSelectStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitStatement(SyntaxKind, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitStatement(SyntaxKind, SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitSubStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitSubStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitTryStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitTryStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitWhileStatement()

An exit statement. The kind of block being exited can be found by examining the Kind.

ExitWhileStatement(SyntaxToken, SyntaxToken)

An exit statement. The kind of block being exited can be found by examining the Kind.

ExponentiateAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

ExponentiateAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

ExponentiateExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ExponentiateExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ExpressionRangeVariable(ExpressionSyntax)

Describes a single variable of the form "[x [As Type] =] expression" for use in query expressions.

ExpressionRangeVariable(VariableNameEqualsSyntax, ExpressionSyntax)

Describes a single variable of the form "[x [As Type] =] expression" for use in query expressions.

ExpressionStatement(ExpressionSyntax)

Represent an expression in a statement context. This may only be a invocation or await expression in standard code but may be any expression in VB Interactive code.

ExternalChecksumDirectiveTrivia()

Represents an #ExternalChecksum pre-processing directive appearing in source.

ExternalChecksumDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken)

Represents an #ExternalChecksum pre-processing directive appearing in source.

ExternalSourceDirectiveTrivia()

Represents the beginning of a #ExternalSource pre-processing directive appearing in source.

ExternalSourceDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken)

Represents the beginning of a #ExternalSource pre-processing directive appearing in source.

FalseLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

FieldDeclaration(SeparatedSyntaxList<VariableDeclaratorSyntax>)

Represents the declaration of one or more variables or constants, either as local variables or as class/structure members. In the case of a constant, it is represented by having "Const" in the Modifiers (although technically "Const" is not a modifier, it is represented as one in the parse trees.)

FieldDeclaration(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SeparatedSyntaxList<VariableDeclaratorSyntax>)

Represents the declaration of one or more variables or constants, either as local variables or as class/structure members. In the case of a constant, it is represented by having "Const" in the Modifiers (although technically "Const" is not a modifier, it is represented as one in the parse trees.)

FieldDeclaration(VariableDeclaratorSyntax[])

Represents the declaration of one or more variables or constants, either as local variables or as class/structure members. In the case of a constant, it is represented by having "Const" in the Modifiers (although technically "Const" is not a modifier, it is represented as one in the parse trees.)

FinallyBlock()

Represents a "Finally ..." block of a "Try" block.

FinallyBlock(FinallyStatementSyntax, SyntaxList<StatementSyntax>)

Represents a "Finally ..." block of a "Try" block.

FinallyBlock(SyntaxList<StatementSyntax>)

Represents a "Finally ..." block of a "Try" block.

FinallyStatement()

Represents the "Finally" statement that begins a "Finally" block.

FinallyStatement(SyntaxToken)

Represents the "Finally" statement that begins a "Finally" block.

FloatingLiteralToken(String, TypeCharacter, Double)
FloatingLiteralToken(SyntaxTriviaList, String, TypeCharacter, Double, SyntaxTriviaList)
ForBlock(ForStatementSyntax)

Represents a For block, including the introducing statement, the body and the "Next" (which can be omitted if a containing For has a Next with multiple variables).

ForBlock(ForStatementSyntax, SyntaxList<StatementSyntax>, NextStatementSyntax)

Represents a For block, including the introducing statement, the body and the "Next" (which can be omitted if a containing For has a Next with multiple variables).

ForEachBlock(ForEachStatementSyntax)

Represents a For Each block, including the introducing statement, the body and the "Next" (which can be omitted if a containing For has a Next with multiple variables).

ForEachBlock(ForEachStatementSyntax, SyntaxList<StatementSyntax>, NextStatementSyntax)

Represents a For Each block, including the introducing statement, the body and the "Next" (which can be omitted if a containing For has a Next with multiple variables).

ForEachStatement(SyntaxToken, SyntaxToken, VisualBasicSyntaxNode, SyntaxToken, ExpressionSyntax)

The For Each statement that begins a For Each-Next block. This statement always occurs as the Begin of a ForBlock, and the body of the For Each-Next is the Body of that ForBlock. Most of the time, the End of that ForBlock is the corresponding Next statement. However, multiple nested For statements are ended by a single Next statement with multiple variables, then the inner For statements will have End set to Nothing, and the Next statement is the End of the outermost For statement that is being ended.

ForEachStatement(VisualBasicSyntaxNode, ExpressionSyntax)

The For Each statement that begins a For Each-Next block. This statement always occurs as the Begin of a ForBlock, and the body of the For Each-Next is the Body of that ForBlock. Most of the time, the End of that ForBlock is the corresponding Next statement. However, multiple nested For statements are ended by a single Next statement with multiple variables, then the inner For statements will have End set to Nothing, and the Next statement is the End of the outermost For statement that is being ended.

ForStatement(SyntaxToken, VisualBasicSyntaxNode, SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax, ForStepClauseSyntax)

The For statement that begins a For-Next block. This statement always occurs as the Begin of a ForBlock. Most of the time, the End of that ForBlock is the corresponding Next statement. However, multiple nested For statements are ended by a single Next statement with multiple variables, then the inner For statements will have End set to Nothing, and the Next statement is the End of the outermost For statement that is being ended.

ForStatement(VisualBasicSyntaxNode, ExpressionSyntax, ExpressionSyntax)

The For statement that begins a For-Next block. This statement always occurs as the Begin of a ForBlock. Most of the time, the End of that ForBlock is the corresponding Next statement. However, multiple nested For statements are ended by a single Next statement with multiple variables, then the inner For statements will have End set to Nothing, and the Next statement is the End of the outermost For statement that is being ended.

ForStatement(VisualBasicSyntaxNode, ExpressionSyntax, ExpressionSyntax, ForStepClauseSyntax)

The For statement that begins a For-Next block. This statement always occurs as the Begin of a ForBlock. Most of the time, the End of that ForBlock is the corresponding Next statement. However, multiple nested For statements are ended by a single Next statement with multiple variables, then the inner For statements will have End set to Nothing, and the Next statement is the End of the outermost For statement that is being ended.

ForStepClause(ExpressionSyntax)

The Step clause in a For Statement.

ForStepClause(SyntaxToken, ExpressionSyntax)

The Step clause in a For Statement.

FromClause(CollectionRangeVariableSyntax[])

Represents a "From" query operator. If this is the beginning of a query, the Source will be Nothing. Otherwise, the Source will be the part of the query to the left of the From.

FromClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>)

Represents a "From" query operator. If this is the beginning of a query, the Source will be Nothing. Otherwise, the Source will be the part of the query to the left of the From.

FromClause(SyntaxToken, SeparatedSyntaxList<CollectionRangeVariableSyntax>)

Represents a "From" query operator. If this is the beginning of a query, the Source will be Nothing. Otherwise, the Source will be the part of the query to the left of the From.

FunctionAggregation(String)

Represents an invocation of an Aggregation function in the aggregation range variable declaration of a Group By, Group Join or Aggregate query operator.

FunctionAggregation(SyntaxToken)

Represents an invocation of an Aggregation function in the aggregation range variable declaration of a Group By, Group Join or Aggregate query operator.

FunctionAggregation(SyntaxToken, ExpressionSyntax)

Represents an invocation of an Aggregation function in the aggregation range variable declaration of a Group By, Group Join or Aggregate query operator.

FunctionAggregation(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents an invocation of an Aggregation function in the aggregation range variable declaration of a Group By, Group Join or Aggregate query operator.

FunctionBlock(MethodStatementSyntax)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

FunctionBlock(MethodStatementSyntax, SyntaxList<StatementSyntax>)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

FunctionBlock(MethodStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

FunctionLambdaHeader()

Represents the header part of a lambda expression

FunctionLambdaHeader(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax, SimpleAsClauseSyntax)

Represents the header part of a lambda expression

FunctionLambdaHeader(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax)

Represents the header part of a lambda expression

FunctionStatement(String)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

FunctionStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax, HandlesClauseSyntax, ImplementsClauseSyntax)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

FunctionStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax, HandlesClauseSyntax, ImplementsClauseSyntax)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

FunctionStatement(SyntaxToken)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

GenericName(String, TypeArgumentListSyntax)

Represents a simple type name with one or more generic arguments, such as "X(Of Y, Z).

GenericName(SyntaxToken, TypeArgumentListSyntax)

Represents a simple type name with one or more generic arguments, such as "X(Of Y, Z).

GetAccessorBlock(AccessorStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

GetAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

GetAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

GetAccessorStatement()

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

GetAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

GetAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

GetStandaloneExpression(ExpressionSyntax)

Names on the right of qualified names and member access expressions are not stand-alone expressions. This method returns the appropriate parent of name syntax nodes that are on right of these constructs.

GetTypeExpression(SyntaxToken, SyntaxToken, TypeSyntax, SyntaxToken)

Represents a GetType expression.

GetTypeExpression(TypeSyntax)

Represents a GetType expression.

GetXmlNamespaceExpression()

Represents a GetXmlNamespace expression.

GetXmlNamespaceExpression(SyntaxToken, SyntaxToken, XmlPrefixNameSyntax, SyntaxToken)

Represents a GetXmlNamespace expression.

GlobalName()

Represents a name in the global namespace.

GlobalName(SyntaxToken)

Represents a name in the global namespace.

GoToStatement(LabelSyntax)

Represents a "GoTo" statement.

GoToStatement(SyntaxToken, LabelSyntax)

Represents a "GoTo" statement.

GreaterThanExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

GreaterThanExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

GreaterThanOrEqualExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

GreaterThanOrEqualExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

GroupAggregation()

Represents the use of "Group" as the aggregation function in the in the aggregation range variable declaration of a Group By or Group Join query operator.

GroupAggregation(SyntaxToken)

Represents the use of "Group" as the aggregation function in the in the aggregation range variable declaration of a Group By or Group Join query operator.

GroupByClause(SeparatedSyntaxList<ExpressionRangeVariableSyntax>, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents the "Group By" query operator.

GroupByClause(SeparatedSyntaxList<ExpressionRangeVariableSyntax>, SeparatedSyntaxList<ExpressionRangeVariableSyntax>, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents the "Group By" query operator.

GroupByClause(SyntaxToken, SeparatedSyntaxList<ExpressionRangeVariableSyntax>, SyntaxToken, SeparatedSyntaxList<ExpressionRangeVariableSyntax>, SyntaxToken, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents the "Group By" query operator.

GroupJoinClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>, SeparatedSyntaxList<JoinConditionSyntax>, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents the "Group Join" query operator.

GroupJoinClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>, SyntaxList<JoinClauseSyntax>, SeparatedSyntaxList<JoinConditionSyntax>, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents the "Group Join" query operator.

GroupJoinClause(SyntaxToken, SyntaxToken, SeparatedSyntaxList<CollectionRangeVariableSyntax>, SyntaxList<JoinClauseSyntax>, SyntaxToken, SeparatedSyntaxList<JoinConditionSyntax>, SyntaxToken, SeparatedSyntaxList<AggregationRangeVariableSyntax>)

Represents the "Group Join" query operator.

HandlesClause(HandlesClauseItemSyntax[])

Represents the "Handles ..." clause on a method declaration that describes which events this method handles.

HandlesClause(SeparatedSyntaxList<HandlesClauseItemSyntax>)

Represents the "Handles ..." clause on a method declaration that describes which events this method handles.

HandlesClause(SyntaxToken, SeparatedSyntaxList<HandlesClauseItemSyntax>)

Represents the "Handles ..." clause on a method declaration that describes which events this method handles.

HandlesClauseItem(EventContainerSyntax, IdentifierNameSyntax)

Represents a single handled event in a "Handles ..." clause.

HandlesClauseItem(EventContainerSyntax, SyntaxToken, IdentifierNameSyntax)

Represents a single handled event in a "Handles ..." clause.

Identifier(String)
Identifier(String, Boolean, String, TypeCharacter)
Identifier(SyntaxTriviaList, String, Boolean, String, TypeCharacter, SyntaxTriviaList)
Identifier(SyntaxTriviaList, String, SyntaxTriviaList)
IdentifierLabel(String)

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

IdentifierLabel(SyntaxToken)

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

IdentifierName(String)

Represents a type name consisting of a single identifier (which might include brackets or a type character).

IdentifierName(SyntaxToken)

Represents a type name consisting of a single identifier (which might include brackets or a type character).

IfDirectiveTrivia(SyntaxKind, SyntaxToken, ExpressionSyntax)

Represents the beginning of an #If pre-processing directive appearing in source.

IfDirectiveTrivia(SyntaxKind, SyntaxToken, SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents the beginning of an #If pre-processing directive appearing in source.

IfDirectiveTrivia(SyntaxToken, ExpressionSyntax)

Represents the beginning of an #If pre-processing directive appearing in source.

IfDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents the beginning of an #If pre-processing directive appearing in source.

IfStatement(ExpressionSyntax)

Represents the "If ... Then" statement that begins a multi-line "If" block.

IfStatement(SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents the "If ... Then" statement that begins a multi-line "If" block.

ImplementsClause(QualifiedNameSyntax[])

Represents the "Implements ..." clause on a type member, which describes which interface members this member implements.

ImplementsClause(SeparatedSyntaxList<QualifiedNameSyntax>)

Represents the "Implements ..." clause on a type member, which describes which interface members this member implements.

ImplementsClause(SyntaxToken, SeparatedSyntaxList<QualifiedNameSyntax>)

Represents the "Implements ..." clause on a type member, which describes which interface members this member implements.

ImplementsStatement(SeparatedSyntaxList<TypeSyntax>)

Represents an Implements statement in a Class or Structure.

ImplementsStatement(SyntaxToken, SeparatedSyntaxList<TypeSyntax>)

Represents an Implements statement in a Class or Structure.

ImplementsStatement(TypeSyntax[])

Represents an Implements statement in a Class or Structure.

ImportAliasClause(String)

Represents an alias identifier followed by an "=" token in an Imports clause.

ImportAliasClause(SyntaxToken)

Represents an alias identifier followed by an "=" token in an Imports clause.

ImportAliasClause(SyntaxToken, SyntaxToken)

Represents an alias identifier followed by an "=" token in an Imports clause.

ImportsStatement()

Represents an Imports statement, which has one or more imports clauses.

ImportsStatement(SeparatedSyntaxList<ImportsClauseSyntax>)

Represents an Imports statement, which has one or more imports clauses.

ImportsStatement(SyntaxToken, SeparatedSyntaxList<ImportsClauseSyntax>)

Represents an Imports statement, which has one or more imports clauses.

IncompleteMember()

Represents the beginning of a declaration. However, not enough syntax is detected to classify this as a field, method, property or event. This is node always represents a syntax error.

IncompleteMember(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken)

Represents the beginning of a declaration. However, not enough syntax is detected to classify this as a field, method, property or event. This is node always represents a syntax error.

InferredFieldInitializer(ExpressionSyntax)

Represent a field initializer in a With {...} initializer where the field name is inferred from the initializer expression.

InferredFieldInitializer(SyntaxToken, ExpressionSyntax)

Represent a field initializer in a With {...} initializer where the field name is inferred from the initializer expression.

InheritsStatement(SeparatedSyntaxList<TypeSyntax>)

Represents an Inherits statement in a Class, Structure or Interface.

InheritsStatement(SyntaxToken, SeparatedSyntaxList<TypeSyntax>)

Represents an Inherits statement in a Class, Structure or Interface.

InheritsStatement(TypeSyntax[])

Represents an Inherits statement in a Class, Structure or Interface.

IntegerDivideAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

IntegerDivideAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

IntegerDivideExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

IntegerDivideExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

IntegerLiteralToken(String, LiteralBase, TypeCharacter, UInt64)
IntegerLiteralToken(SyntaxTriviaList, String, LiteralBase, TypeCharacter, UInt64, SyntaxTriviaList)
InterfaceBlock(InterfaceStatementSyntax)

Represents a declaration of a Interface, its contents and the End statement that ends it.

InterfaceBlock(InterfaceStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>)

Represents a declaration of a Interface, its contents and the End statement that ends it.

InterfaceBlock(InterfaceStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a declaration of a Interface, its contents and the End statement that ends it.

InterfaceStatement(String)

Represents the beginning statement of a Interface declaration. This node always appears as the Begin of a TypeBlock with Kind=InterfaceDeclarationBlock.

InterfaceStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Interface declaration. This node always appears as the Begin of a TypeBlock with Kind=InterfaceDeclarationBlock.

InterfaceStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Interface declaration. This node always appears as the Begin of a TypeBlock with Kind=InterfaceDeclarationBlock.

InterfaceStatement(SyntaxToken)

Represents the beginning statement of a Interface declaration. This node always appears as the Begin of a TypeBlock with Kind=InterfaceDeclarationBlock.

InterpolatedStringExpression(InterpolatedStringContentSyntax[])

Represents an interpolated string expression.

InterpolatedStringExpression(SyntaxList<InterpolatedStringContentSyntax>)

Represents an interpolated string expression.

InterpolatedStringExpression(SyntaxToken, SyntaxList<InterpolatedStringContentSyntax>, SyntaxToken)

Represents an interpolated string expression.

InterpolatedStringText()

Represents literal text content in an interpolated string.

InterpolatedStringText(SyntaxToken)

Represents literal text content in an interpolated string.

InterpolatedStringTextToken(String, String)

Represents literal character data in interpolated string expression.

InterpolatedStringTextToken(SyntaxTriviaList, String, String, SyntaxTriviaList)

Represents literal character data in interpolated string expression.

Interpolation(ExpressionSyntax)

Represents an interpolation of an expression in an interpolated string expression e.g. '{expression[,alignment][:formatString]}'.

Interpolation(ExpressionSyntax, InterpolationAlignmentClauseSyntax)

Represents an interpolation of an expression in an interpolated string expression e.g. '{expression[,alignment][:formatString]}'.

Interpolation(SyntaxToken, ExpressionSyntax, InterpolationAlignmentClauseSyntax, InterpolationFormatClauseSyntax, SyntaxToken)

Represents an interpolation of an expression in an interpolated string expression e.g. '{expression[,alignment][:formatString]}'.

InterpolationAlignmentClause(ExpressionSyntax)

Represents an alignment clause ',alignment' of an interpolated string embedded expression.

InterpolationAlignmentClause(SyntaxToken, ExpressionSyntax)

Represents an alignment clause ',alignment' of an interpolated string embedded expression.

InterpolationFormatClause()

Represents a format string clause ':formatString' of an interpolated string embedded expression.

InterpolationFormatClause(SyntaxToken, SyntaxToken)

Represents a format string clause ':formatString' of an interpolated string embedded expression.

InvocationExpression()

Represents an invocation expression consisting of an invocation target and an optional argument list or an array, parameterized property or object default property index.

InvocationExpression(ExpressionSyntax)
InvocationExpression(ExpressionSyntax, ArgumentListSyntax)

Represents an invocation expression consisting of an invocation target and an optional argument list or an array, parameterized property or object default property index.

IsExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

IsExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

IsNotExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

IsNotExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

JoinCondition(ExpressionSyntax, ExpressionSyntax)

Represents the "expression Equals expression" condition in a Join.

JoinCondition(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents the "expression Equals expression" condition in a Join.

KeywordEventContainer(SyntaxToken)

Represents event container specified through special keywords "Me", "MyBase" or "MyClass"..

Label(SyntaxKind, String)

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

Label(SyntaxKind, SyntaxToken)

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

LabelStatement(String)

Represents a label statement.

LabelStatement(SyntaxToken)

Represents a label statement.

LabelStatement(SyntaxToken, SyntaxToken)

Represents a label statement.

LambdaHeader(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax)

Represents the header part of a lambda expression

LambdaHeader(SyntaxKind, SyntaxToken)

Represents the header part of a lambda expression

LeftShiftAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

LeftShiftAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

LeftShiftExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LeftShiftExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LessThanExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LessThanExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LessThanOrEqualExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LessThanOrEqualExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LetClause(ExpressionRangeVariableSyntax[])

Represents a "Let" query operator.

LetClause(SeparatedSyntaxList<ExpressionRangeVariableSyntax>)

Represents a "Let" query operator.

LetClause(SyntaxToken, SeparatedSyntaxList<ExpressionRangeVariableSyntax>)

Represents a "Let" query operator.

LikeExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LikeExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

LineContinuationTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

List<TNode>()

Creates an empty list of syntax nodes.

List<TNode>(IEnumerable<TNode>)

Creates a list of syntax nodes.

Literal(Char)

Creates a token with kind CharacterLiteralToken from a character value.

Literal(Decimal)

Creates a token with kind DecimalLiteralToken from a decimal value.

Literal(Double)

Creates a token with kind FloatingLiteralToken from an 8-byte floating point value.

Literal(Int32)

Creates a token with kind IntegerLiteralToken from a 4-byte signed integer value.

Literal(Int64)

Creates a token with kind IntegerLiteralToken from an 8-byte signed integer value.

Literal(Single)

Creates a token with kind FloatingLiteralToken from a 4-byte floating point value.

Literal(String)

Creates a token with kind StringLiteralToken from a string value.

Literal(String, Char)

Creates a token with kind CharacterLiteralToken from the text and corresponding character value.

Literal(String, Decimal)

Creates a token with kind DecimalLiteralToken from the text and corresponding decimal value.

Literal(String, Double)

Creates a token with kind FloatingLiteralToken from the text and corresponding 8-byte floating point value.

Literal(String, Int32)

Creates a token with kind IntegerLiteralToken from the text and corresponding 4-byte signed integer value.

Literal(String, Int64)

Creates a token with kind IntegerLiteralToken from the text and corresponding 8-byte signed integer value.

Literal(String, Single)

Creates a token with kind FloatingLiteralToken from the text and corresponding 4-byte floating point value.

Literal(String, String)

Creates a token with kind StringLiteralToken from the text and corresponding string value.

Literal(String, UInt32)

Creates a token with kind IntegerLiteralToken from the text and corresponding 4-byte unsigned integer value.

Literal(String, UInt64)

Creates a token with kind IntegerLiteralToken from the text and corresponding 8-byte unsigned integer value.

Literal(SyntaxTriviaList, String, Char, SyntaxTriviaList)

Creates a token with kind CharacterLiteralToken from the text and corresponding character value.

Literal(SyntaxTriviaList, String, Decimal, SyntaxTriviaList)

Creates a token with kind DecimalLiteralToken from the text and corresponding decimal value.

Literal(SyntaxTriviaList, String, Double, SyntaxTriviaList)

Creates a token with kind FloatingLiteralToken from the text and corresponding 8-byte floating point value.

Literal(SyntaxTriviaList, String, Int32, SyntaxTriviaList)

Creates a token with kind IntegerLiteralToken from the text and corresponding 4-byte signed integer value.

Literal(SyntaxTriviaList, String, Int64, SyntaxTriviaList)

Creates a token with kind IntegerLiteralToken from the text and corresponding 8-byte signed integer value.

Literal(SyntaxTriviaList, String, Single, SyntaxTriviaList)

Creates a token with kind FloatingLiteralToken from the text and corresponding 4-byte floating point value.

Literal(SyntaxTriviaList, String, String, SyntaxTriviaList)

Creates a token with kind StringLiteralToken from the text and corresponding string value.

Literal(SyntaxTriviaList, String, UInt32, SyntaxTriviaList)

Creates a token with kind IntegerLiteralToken from the text and corresponding 4-byte unsigned integer value.

Literal(SyntaxTriviaList, String, UInt64, SyntaxTriviaList)

Creates a token with kind IntegerLiteralToken from the text and corresponding 8-byte unsigned integer value.

Literal(UInt32)

Creates a token with kind IntegerLiteralToken from a 4-byte unsigned integer value.

Literal(UInt64)

Creates a token with kind IntegerLiteralToken from an 8-byte unsigned integer value.

LiteralExpression(SyntaxKind, SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

LocalDeclarationStatement(SyntaxTokenList, SeparatedSyntaxList<VariableDeclaratorSyntax>)

Represents the declaration of one or more local variables or constants.

LoopStatement(SyntaxKind)

The Loop statement that begins a Do-Loop block.

LoopStatement(SyntaxKind, SyntaxToken, WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

LoopStatement(SyntaxKind, WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

LoopUntilStatement()

The Loop statement that begins a Do-Loop block.

LoopUntilStatement(SyntaxToken, WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

LoopUntilStatement(WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

LoopWhileStatement()

The Loop statement that begins a Do-Loop block.

LoopWhileStatement(SyntaxToken, WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

LoopWhileStatement(WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

MeExpression()

Identifies the special instance "Me"

MeExpression(SyntaxToken)

Identifies the special instance "Me"

MemberAccessExpression(SyntaxKind, ExpressionSyntax, SyntaxToken, SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

MemberAccessExpression(SyntaxKind, SyntaxToken, SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

MethodBlock(SyntaxKind, MethodStatementSyntax, EndBlockStatementSyntax)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

MethodBlock(SyntaxKind, MethodStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

MethodStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax, HandlesClauseSyntax, ImplementsClauseSyntax)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

MethodStatement(SyntaxKind, SyntaxToken, String)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

MethodStatement(SyntaxKind, SyntaxToken, SyntaxToken)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

MidAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

MidAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

MidExpression(String, ArgumentListSyntax)

Represents a left-hand side of a MidAssignment statement.

MidExpression(SyntaxToken, ArgumentListSyntax)

Represents a left-hand side of a MidAssignment statement.

ModifiedIdentifier(String)

Represents an identifier with optional "?" or "()" or "(,,,)" modifiers, as used in parameter declarations and variable declarations.

ModifiedIdentifier(SyntaxToken)

Represents an identifier with optional "?" or "()" or "(,,,)" modifiers, as used in parameter declarations and variable declarations.

ModifiedIdentifier(SyntaxToken, ArgumentListSyntax)

Represents an identifier with optional "?" or "()" or "(,,,)" modifiers, as used in parameter declarations and variable declarations.

ModifiedIdentifier(SyntaxToken, SyntaxToken, ArgumentListSyntax, SyntaxList<ArrayRankSpecifierSyntax>)

Represents an identifier with optional "?" or "()" or "(,,,)" modifiers, as used in parameter declarations and variable declarations.

ModuleBlock(ModuleStatementSyntax)

Represents a declaration of Module, its contents and the End statement that ends it.

ModuleBlock(ModuleStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>)

Represents a declaration of Module, its contents and the End statement that ends it.

ModuleBlock(ModuleStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a declaration of Module, its contents and the End statement that ends it.

ModuleStatement(String)

Represents the beginning statement of a Module declaration. This node always appears as the Begin of a TypeBlock with Kind=ModuleDeclarationBlock.

ModuleStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Module declaration. This node always appears as the Begin of a TypeBlock with Kind=ModuleDeclarationBlock.

ModuleStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Module declaration. This node always appears as the Begin of a TypeBlock with Kind=ModuleDeclarationBlock.

ModuleStatement(SyntaxToken)

Represents the beginning statement of a Module declaration. This node always appears as the Begin of a TypeBlock with Kind=ModuleDeclarationBlock.

ModuloExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

ModuloExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

MultiLineFunctionLambdaExpression(LambdaHeaderSyntax, EndBlockStatementSyntax)

Represents a multi-line lambda expression.

MultiLineFunctionLambdaExpression(LambdaHeaderSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a multi-line lambda expression.

MultiLineIfBlock(IfStatementSyntax)

Represents a multi-line "If ... Then ... ElseIf ... Then ... Else ... End If" block.

MultiLineIfBlock(IfStatementSyntax, SyntaxList<StatementSyntax>, SyntaxList<ElseIfBlockSyntax>, ElseBlockSyntax)

Represents a multi-line "If ... Then ... ElseIf ... Then ... Else ... End If" block.

MultiLineIfBlock(IfStatementSyntax, SyntaxList<StatementSyntax>, SyntaxList<ElseIfBlockSyntax>, ElseBlockSyntax, EndBlockStatementSyntax)

Represents a multi-line "If ... Then ... ElseIf ... Then ... Else ... End If" block.

MultiLineLambdaExpression(SyntaxKind, LambdaHeaderSyntax, EndBlockStatementSyntax)

Represents a multi-line lambda expression.

MultiLineLambdaExpression(SyntaxKind, LambdaHeaderSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a multi-line lambda expression.

MultiLineSubLambdaExpression(LambdaHeaderSyntax, EndBlockStatementSyntax)

Represents a multi-line lambda expression.

MultiLineSubLambdaExpression(LambdaHeaderSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a multi-line lambda expression.

MultiplyAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

MultiplyAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

MultiplyExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

MultiplyExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

MyBaseExpression()

Identifies the special instance "MyBase"

MyBaseExpression(SyntaxToken)

Identifies the special instance "MyBase"

MyClassExpression()

Identifies the special instance "MyClass"

MyClassExpression(SyntaxToken)

Identifies the special instance "MyClass"

NameColonEquals(IdentifierNameSyntax)

Represents an identifier name followed by a ":=" token in a named argument.

NameColonEquals(IdentifierNameSyntax, SyntaxToken)

Represents an identifier name followed by a ":=" token in a named argument.

NamedFieldInitializer(IdentifierNameSyntax, ExpressionSyntax)

Represent a named field initializer in a With {...} initializer, such as ".x = expr".

NamedFieldInitializer(SyntaxToken, SyntaxToken, IdentifierNameSyntax, SyntaxToken, ExpressionSyntax)

Represent a named field initializer in a With {...} initializer, such as ".x = expr".

NamedTupleElement(String)

Represents a single declaration of a tuple element supplying element name and optionally a type.

NamedTupleElement(SyntaxToken)

Represents a single declaration of a tuple element supplying element name and optionally a type.

NamedTupleElement(SyntaxToken, SimpleAsClauseSyntax)

Represents a single declaration of a tuple element supplying element name and optionally a type.

NameOfExpression(ExpressionSyntax)

Represents a NameOf expression.

NameOfExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents a NameOf expression.

NamespaceBlock(NamespaceStatementSyntax)

Represents a Namespace statement, its contents and the End Namespace statement.

NamespaceBlock(NamespaceStatementSyntax, SyntaxList<StatementSyntax>)

Represents a Namespace statement, its contents and the End Namespace statement.

NamespaceBlock(NamespaceStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a Namespace statement, its contents and the End Namespace statement.

NamespaceStatement(NameSyntax)

Represents the beginning statement of a namespace declaration. This node always appears as the Begin of a BlockStatement with Kind=NamespaceBlock.

NamespaceStatement(SyntaxToken, NameSyntax)

Represents the beginning statement of a namespace declaration. This node always appears as the Begin of a BlockStatement with Kind=NamespaceBlock.

NewConstraint(SyntaxToken)

One of the special type parameter constraints: New, Class or Structure. Which kind of special constraint it is can be obtained from the Kind property and is one of: NewConstraint, ReferenceConstraint or ValueConstraint.

NextLabel()

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

NextLabel(SyntaxToken)

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

NextStatement()

The Next statement that ends a For-Next or For Each-Next block. This statement always occurs as the End of a ForBlock (with Kind=ForBlock or ForEachBlock), and the body of the For-Next is the Body of that ForBlock. The Begin of that ForBlock has the corresponding For or For Each statement.

NextStatement(SeparatedSyntaxList<ExpressionSyntax>)

The Next statement that ends a For-Next or For Each-Next block. This statement always occurs as the End of a ForBlock (with Kind=ForBlock or ForEachBlock), and the body of the For-Next is the Body of that ForBlock. The Begin of that ForBlock has the corresponding For or For Each statement.

NextStatement(SyntaxToken, SeparatedSyntaxList<ExpressionSyntax>)

The Next statement that ends a For-Next or For Each-Next block. This statement always occurs as the End of a ForBlock (with Kind=ForBlock or ForEachBlock), and the body of the For-Next is the Body of that ForBlock. The Begin of that ForBlock has the corresponding For or For Each statement.

NodeOrTokenList()

Creates an empty SyntaxNodeOrTokenList.

NodeOrTokenList(IEnumerable<SyntaxNodeOrToken>)

Creates a SyntaxNodeOrTokenList from a sequence of nodes and tokens.

NodeOrTokenList(SyntaxNodeOrToken[])

Creates a SyntaxNodeOrTokenList from one or more nodes and tokens.

NotEqualsExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

NotEqualsExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

NotExpression(ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

NotExpression(SyntaxToken, ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

NothingLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

NullableType(TypeSyntax)

A type name that represents a nullable type, such as "Integer?".

NullableType(TypeSyntax, SyntaxToken)

A type name that represents a nullable type, such as "Integer?".

NumericLabel()

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

NumericLabel(SyntaxToken)

A label for a GoTo, Resume, or On Error statement. An identifier, line number, or next keyword.

NumericLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

ObjectCollectionInitializer(CollectionInitializerSyntax)

Represents a "From {...} clause used to initialize a new collection object's elements.

ObjectCollectionInitializer(SyntaxToken, CollectionInitializerSyntax)

Represents a "From {...} clause used to initialize a new collection object's elements.

ObjectCreationExpression(SyntaxList<AttributeListSyntax>, TypeSyntax, ArgumentListSyntax, ObjectCreationInitializerSyntax)

Represents a New expression that creates a new non-array object, possibly with a "With" or "From" clause.

ObjectCreationExpression(SyntaxToken, SyntaxList<AttributeListSyntax>, TypeSyntax, ArgumentListSyntax, ObjectCreationInitializerSyntax)

Represents a New expression that creates a new non-array object, possibly with a "With" or "From" clause.

ObjectCreationExpression(TypeSyntax)

Represents a New expression that creates a new non-array object, possibly with a "With" or "From" clause.

ObjectMemberInitializer(FieldInitializerSyntax[])

Represents a "With {...} clause used to initialize a new object's members.

ObjectMemberInitializer(SeparatedSyntaxList<FieldInitializerSyntax>)

Represents a "With {...} clause used to initialize a new object's members.

ObjectMemberInitializer(SyntaxToken, SyntaxToken, SeparatedSyntaxList<FieldInitializerSyntax>, SyntaxToken)

Represents a "With {...} clause used to initialize a new object's members.

OmittedArgument()

Represents an omitted argument in an argument list. An omitted argument is not considered a syntax error but a valid case when no argument is required.

OmittedArgument(SyntaxToken)

Represents an omitted argument in an argument list. An omitted argument is not considered a syntax error but a valid case when no argument is required.

OnErrorGoToLabelStatement(LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToLabelStatement(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToMinusOneStatement(LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToMinusOneStatement(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToStatement(SyntaxKind, LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToStatement(SyntaxKind, SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToZeroStatement(LabelSyntax)

Represents an OnError Goto statement.

OnErrorGoToZeroStatement(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken, LabelSyntax)

Represents an OnError Goto statement.

OnErrorResumeNextStatement()

Represents an OnError Resume Next statement.

OnErrorResumeNextStatement(SyntaxToken, SyntaxToken, SyntaxToken, SyntaxToken)

Represents an OnError Resume Next statement.

OperatorBlock(OperatorStatementSyntax)

Represents an Operator block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

OperatorBlock(OperatorStatementSyntax, SyntaxList<StatementSyntax>)

Represents an Operator block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

OperatorBlock(OperatorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an Operator block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

OperatorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares an operator. If this operator has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

OperatorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax)

A statement that declares an operator. If this operator has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

OperatorStatement(SyntaxToken)

A statement that declares an operator. If this operator has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

OptionStatement(SyntaxToken)

Represents an Option statement, such as "Option Strict On".

OptionStatement(SyntaxToken, SyntaxToken)

Represents an Option statement, such as "Option Strict On".

OptionStatement(SyntaxToken, SyntaxToken, SyntaxToken)

Represents an Option statement, such as "Option Strict On".

OrderByClause(OrderingSyntax[])

Represents the "Order By" query operator.

OrderByClause(SeparatedSyntaxList<OrderingSyntax>)

Represents the "Order By" query operator.

OrderByClause(SyntaxToken, SyntaxToken, SeparatedSyntaxList<OrderingSyntax>)

Represents the "Order By" query operator.

Ordering(SyntaxKind, ExpressionSyntax)

An expression to order by, plus an optional ordering. The Kind indicates whether to order in ascending or descending order.

Ordering(SyntaxKind, ExpressionSyntax, SyntaxToken)

An expression to order by, plus an optional ordering. The Kind indicates whether to order in ascending or descending order.

OrElseExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

OrElseExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

OrExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

OrExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

Parameter(ModifiedIdentifierSyntax)

Represent a parameter to a method, property, constructor, etc.

Parameter(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ModifiedIdentifierSyntax, SimpleAsClauseSyntax, EqualsValueSyntax)

Represent a parameter to a method, property, constructor, etc.

ParameterList()

Represents the parameter list in a method declaration.

ParameterList(SeparatedSyntaxList<ParameterSyntax>)

Represents the parameter list in a method declaration.

ParameterList(SyntaxToken, SeparatedSyntaxList<ParameterSyntax>, SyntaxToken)

Represents the parameter list in a method declaration.

ParenthesizedExpression(ExpressionSyntax)

Represents a parenthesized expression.

ParenthesizedExpression(SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents a parenthesized expression.

ParseArgumentList(String, Int32, Boolean)

Parse an argument list.

ParseCompilationUnit(String, Int32, VisualBasicParseOptions)

Parse a compilation unit (a single source file).

ParseExecutableStatement(String, Int32, Boolean)

Parse an executable statement.

ParseExpression(String, Int32, Boolean)

Parse an expression.

ParseLeadingTrivia(String, Int32)

Parse the input for leading trivia.

ParseName(String, Int32, Boolean)

Parse a name.

ParseParameterList(String, Int32, Boolean)

Parse a parameter list.

ParseSyntaxTree(SourceText, ParseOptions, String, CancellationToken)

Produces a syntax tree by parsing the source text.

ParseSyntaxTree(SourceText, ParseOptions, String, ImmutableDictionary<String,ReportDiagnostic>, CancellationToken)

Produces a syntax tree by parsing the source text.

ParseSyntaxTree(String, ParseOptions, String, Encoding, CancellationToken)

Produces a syntax tree by parsing the source text.

ParseSyntaxTree(String, ParseOptions, String, Encoding, ImmutableDictionary<String,ReportDiagnostic>, CancellationToken)

Produces a syntax tree by parsing the source text.

ParseToken(String, Int32, Boolean)

Parse one token.

ParseTokens(String, Int32, Int32, VisualBasicParseOptions)

Parse tokens in the input. Since this API does not create a SyntaxNode that owns all produced tokens, the GetLocation() API may yield surprising results for the produced tokens and its behavior is generally unspecified.

ParseTrailingTrivia(String, Int32)

Parse the input for trailing trivia.

ParseTypeName(String, Int32, Boolean)

Parse a type name.

ParseTypeName(String, Int32, ParseOptions, Boolean)

Parse a type name.

PartitionClause(SyntaxKind, SyntaxToken, ExpressionSyntax)

Represents a "Skip" or "Take" query operator. The Kind property tells which.

PartitionWhileClause(SyntaxKind, SyntaxToken, ExpressionSyntax)

Represents a "Skip While" or "Take While" query operator. The Kind property tells which.

PartitionWhileClause(SyntaxKind, SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a "Skip While" or "Take While" query operator. The Kind property tells which.

PredefinedCastExpression(SyntaxToken, ExpressionSyntax)

Represents a cast to a pre-defined type using a pre-defined cast expression, such as CInt or CLng.

PredefinedCastExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents a cast to a pre-defined type using a pre-defined cast expression, such as CInt or CLng.

PredefinedType(SyntaxToken)

Represents an occurrence of a Visual Basic built-in type such as Integer or String in source code.

PrintStatement(ExpressionSyntax)

Represent a "? expression" "Print" statement in VB Interactive code.

PrintStatement(SyntaxToken, ExpressionSyntax)

Represent a "? expression" "Print" statement in VB Interactive code.

PropertyBlock(PropertyStatementSyntax, SyntaxList<AccessorBlockSyntax>)

Represents a block property declaration: A declaration that has a beginning declaration, some get or set accessor blocks and an end statement.

PropertyBlock(PropertyStatementSyntax, SyntaxList<AccessorBlockSyntax>, EndBlockStatementSyntax)

Represents a block property declaration: A declaration that has a beginning declaration, some get or set accessor blocks and an end statement.

PropertyStatement(String)

Statement that declares a property. If this property has accessors declared, this statement will be the Begin of a BlockNode, and the accessors will be the Body of that node. Auto properties are property declarations without a PropertyBlock.

PropertyStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax, AsClauseSyntax, EqualsValueSyntax, ImplementsClauseSyntax)

Statement that declares a property. If this property has accessors declared, this statement will be the Begin of a BlockNode, and the accessors will be the Body of that node. Auto properties are property declarations without a PropertyBlock.

PropertyStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, ParameterListSyntax, AsClauseSyntax, EqualsValueSyntax, ImplementsClauseSyntax)

Statement that declares a property. If this property has accessors declared, this statement will be the Begin of a BlockNode, and the accessors will be the Body of that node. Auto properties are property declarations without a PropertyBlock.

PropertyStatement(SyntaxToken)

Statement that declares a property. If this property has accessors declared, this statement will be the Begin of a BlockNode, and the accessors will be the Body of that node. Auto properties are property declarations without a PropertyBlock.

QualifiedCrefOperatorReference(NameSyntax, CrefOperatorReferenceSyntax)
QualifiedCrefOperatorReference(NameSyntax, SyntaxToken, CrefOperatorReferenceSyntax)
QualifiedName(NameSyntax, SimpleNameSyntax)

Represents a qualified type name, for example X.Y or X(Of Z).Y.

QualifiedName(NameSyntax, SyntaxToken, SimpleNameSyntax)

Represents a qualified type name, for example X.Y or X(Of Z).Y.

QueryExpression(QueryClauseSyntax[])

This class represents a query expression. A query expression is composed of one or more query operators in a row. The first query operator must be a From or Aggregate.

QueryExpression(SyntaxList<QueryClauseSyntax>)

This class represents a query expression. A query expression is composed of one or more query operators in a row. The first query operator must be a From or Aggregate.

RaiseEventAccessorBlock(AccessorStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

RaiseEventAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

RaiseEventAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

RaiseEventAccessorStatement()

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

RaiseEventAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

RaiseEventAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

RaiseEventStatement(IdentifierNameSyntax)

Represent a RaiseEvent statement.

RaiseEventStatement(IdentifierNameSyntax, ArgumentListSyntax)

Represent a RaiseEvent statement.

RaiseEventStatement(SyntaxToken, IdentifierNameSyntax, ArgumentListSyntax)

Represent a RaiseEvent statement.

RangeArgument(ExpressionSyntax, ExpressionSyntax)

Represents a range argument, such as "0 to 5", used in array bounds. The "Value" property represents the upper bound of the range.

RangeArgument(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a range argument, such as "0 to 5", used in array bounds. The "Value" property represents the upper bound of the range.

RangeCaseClause(ExpressionSyntax, ExpressionSyntax)

Represents a range "expression To expression" in a Case.

RangeCaseClause(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a range "expression To expression" in a Case.

RedimClause(ExpressionSyntax, ArgumentListSyntax)

Represents a ReDim statement clause.

ReDimPreserveStatement(RedimClauseSyntax[])

Represents a ReDim statement.

ReDimPreserveStatement(SeparatedSyntaxList<RedimClauseSyntax>)

Represents a ReDim statement.

ReDimPreserveStatement(SyntaxToken, SyntaxToken, SeparatedSyntaxList<RedimClauseSyntax>)

Represents a ReDim statement.

ReDimStatement(RedimClauseSyntax[])

Represents a ReDim statement.

ReDimStatement(SeparatedSyntaxList<RedimClauseSyntax>)

Represents a ReDim statement.

ReDimStatement(SyntaxKind, RedimClauseSyntax[])

Represents a ReDim statement.

ReDimStatement(SyntaxKind, SeparatedSyntaxList<RedimClauseSyntax>)

Represents a ReDim statement.

ReDimStatement(SyntaxKind, SyntaxToken, SyntaxToken, SeparatedSyntaxList<RedimClauseSyntax>)

Represents a ReDim statement.

ReDimStatement(SyntaxToken, SyntaxToken, SeparatedSyntaxList<RedimClauseSyntax>)

Represents a ReDim statement.

ReferenceDirectiveTrivia()

Represents an #r directive appearing in scripts.

ReferenceDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken)

Represents an #r directive appearing in scripts.

RegionDirectiveTrivia()

Represents the beginning of a #Region directive appearing in source.

RegionDirectiveTrivia(SyntaxToken, SyntaxToken, SyntaxToken)

Represents the beginning of a #Region directive appearing in source.

RelationalCaseClause(SyntaxKind, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

RelationalCaseClause(SyntaxKind, SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a relation clause in a Case statement, such as "Is > expression".

RemoveHandlerAccessorBlock(AccessorStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

RemoveHandlerAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

RemoveHandlerAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

RemoveHandlerAccessorStatement()

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

RemoveHandlerAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

RemoveHandlerAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

RemoveHandlerStatement(ExpressionSyntax, ExpressionSyntax)

Represents an AddHandler or RemoveHandler statement. The Kind property determines which one.

RemoveHandlerStatement(SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents an AddHandler or RemoveHandler statement. The Kind property determines which one.

ResumeLabelStatement()

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeLabelStatement(LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeLabelStatement(SyntaxToken, LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeNextStatement()

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeNextStatement(LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeNextStatement(SyntaxToken, LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeStatement()

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeStatement(LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeStatement(SyntaxKind)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeStatement(SyntaxKind, LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeStatement(SyntaxKind, SyntaxToken, LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ResumeStatement(SyntaxToken, LabelSyntax)

Represents a "Resume" statement. The Kind property can be used to determine if this is a "Resume", "Resume Next" or "Resume label" statement.

ReturnStatement()

Represents a "Return" statement.

ReturnStatement(ExpressionSyntax)

Represents a "Return" statement.

ReturnStatement(SyntaxToken, ExpressionSyntax)

Represents a "Return" statement.

RightShiftAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

RightShiftAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

RightShiftExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

RightShiftExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

SelectBlock(SelectStatementSyntax)

Represents a Select Case block, including the Select Case that begins it, the contains Case blocks and the End Select.

SelectBlock(SelectStatementSyntax, SyntaxList<CaseBlockSyntax>)

Represents a Select Case block, including the Select Case that begins it, the contains Case blocks and the End Select.

SelectBlock(SelectStatementSyntax, SyntaxList<CaseBlockSyntax>, EndBlockStatementSyntax)

Represents a Select Case block, including the Select Case that begins it, the contains Case blocks and the End Select.

SelectClause(ExpressionRangeVariableSyntax[])

Represents the "Select" query operator.

SelectClause(SeparatedSyntaxList<ExpressionRangeVariableSyntax>)

Represents the "Select" query operator.

SelectClause(SyntaxToken, SeparatedSyntaxList<ExpressionRangeVariableSyntax>)

Represents the "Select" query operator.

SelectStatement(ExpressionSyntax)

Represents a Select Case statement. This statement always occurs as the Begin of a SelectBlock.

SelectStatement(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a Select Case statement. This statement always occurs as the Begin of a SelectBlock.

SeparatedList<TNode>()

Creates an empty separated list.

SeparatedList<TNode>(IEnumerable<SyntaxNodeOrToken>)

Creates a separated list from a sequence of nodes or tokens. The sequence must start with a node and alternate between nodes and separator tokens.

SeparatedList<TNode>(IEnumerable<TNode>)

Creates a separated list of nodes from a sequence of nodes, synthesizing comma separators in between.

SeparatedList<TNode>(IEnumerable<TNode>, IEnumerable<SyntaxToken>)

Creates a separated list of nodes from a sequence of nodes and a sequence of separator tokens.

SeparatedList<TNode>(SyntaxNodeOrTokenList)

Creates a separated list from a SyntaxNodeOrTokenList. The SyntaxNodeOrTokenList must start with a node and alternate between nodes and separator tokens.

SetAccessorBlock(AccessorStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

SetAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

SetAccessorBlock(AccessorStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an accessor block member declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement. Examples include property accessors and custom event accessors.

SetAccessorStatement()

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

SetAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

SetAccessorStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax)

Represents a Get or Set accessor on a property declaration or an AddHandler, RemoveHandler or RaiseEvent accessor on a custom event declaration. The Kind of the node determines what kind of accessor this is. This statement is always the Begin of a BlockNode, and the body of the accessor is the Body of that node.

SimpleArgument(ExpressionSyntax)

Represents an argument that is just an optional argument name and an expression.

SimpleArgument(NameColonEqualsSyntax, ExpressionSyntax)

Represents an argument that is just an optional argument name and an expression.

SimpleAsClause(SyntaxList<AttributeListSyntax>, TypeSyntax)

Represents an "As {type-name}" clause that does not have an initializer or "New". The type has optional attributes associated with it, although attributes are not permitted in all possible places where this node occurs.

SimpleAsClause(SyntaxToken, SyntaxList<AttributeListSyntax>, TypeSyntax)

Represents an "As {type-name}" clause that does not have an initializer or "New". The type has optional attributes associated with it, although attributes are not permitted in all possible places where this node occurs.

SimpleAsClause(TypeSyntax)

Represents an "As {type-name}" clause that does not have an initializer or "New". The type has optional attributes associated with it, although attributes are not permitted in all possible places where this node occurs.

SimpleAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

SimpleAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

SimpleCaseClause(ExpressionSyntax)

Represents a single value in a Case.

SimpleDoLoopBlock(DoStatementSyntax, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

SimpleDoLoopBlock(DoStatementSyntax, SyntaxList<StatementSyntax>, LoopStatementSyntax)

Represents a Do-Loop block. The Kind property can be used to determine if this is a Do While, Do Until, Do Loop While, Do Loop Until, or infinite Do Loop.

SimpleDoStatement()

The Do statement that begins a Do-Loop block.

SimpleDoStatement(SyntaxToken, WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

SimpleDoStatement(WhileOrUntilClauseSyntax)

The Do statement that begins a Do-Loop block.

SimpleImportsClause(ImportAliasClauseSyntax, NameSyntax)

Represents the clause of an Imports statement that imports all members of a type or namespace or aliases a type or namespace.

SimpleImportsClause(NameSyntax)

Represents the clause of an Imports statement that imports all members of a type or namespace or aliases a type or namespace.

SimpleJoinClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>, SeparatedSyntaxList<JoinConditionSyntax>)

Represents a Join query operator.

SimpleJoinClause(SeparatedSyntaxList<CollectionRangeVariableSyntax>, SyntaxList<JoinClauseSyntax>, SeparatedSyntaxList<JoinConditionSyntax>)

Represents a Join query operator.

SimpleJoinClause(SyntaxToken, SeparatedSyntaxList<CollectionRangeVariableSyntax>, SyntaxList<JoinClauseSyntax>, SyntaxToken, SeparatedSyntaxList<JoinConditionSyntax>)

Represents a Join query operator.

SimpleLoopStatement()

The Loop statement that begins a Do-Loop block.

SimpleLoopStatement(SyntaxToken, WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

SimpleLoopStatement(WhileOrUntilClauseSyntax)

The Loop statement that begins a Do-Loop block.

SimpleMemberAccessExpression(ExpressionSyntax, SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

SimpleMemberAccessExpression(ExpressionSyntax, SyntaxToken, SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

SimpleMemberAccessExpression(SimpleNameSyntax)

Represents member access (.name) or dictionary access (!name). The Kind property determines which kind of access.

SingleLineElseClause()

Represents the "Else ..." clause of a single-line "If" statement.

SingleLineElseClause(SyntaxList<StatementSyntax>)

Represents the "Else ..." clause of a single-line "If" statement.

SingleLineElseClause(SyntaxToken, SyntaxList<StatementSyntax>)

Represents the "Else ..." clause of a single-line "If" statement.

SingleLineFunctionLambdaExpression(LambdaHeaderSyntax, VisualBasicSyntaxNode)

Represents a single line lambda expression.

SingleLineIfStatement(ExpressionSyntax)

Represents a single-line "If ... Then ... Else ..." statement.

SingleLineIfStatement(ExpressionSyntax, SyntaxList<StatementSyntax>, SingleLineElseClauseSyntax)

Represents a single-line "If ... Then ... Else ..." statement.

SingleLineIfStatement(SyntaxToken, ExpressionSyntax, SyntaxToken, SyntaxList<StatementSyntax>, SingleLineElseClauseSyntax)

Represents a single-line "If ... Then ... Else ..." statement.

SingleLineLambdaExpression(SyntaxKind, LambdaHeaderSyntax, VisualBasicSyntaxNode)

Represents a single line lambda expression.

SingleLineSubLambdaExpression(LambdaHeaderSyntax, VisualBasicSyntaxNode)

Represents a single line lambda expression.

SingletonList<TNode>(TNode)

Creates a singleton list of syntax nodes.

SingletonSeparatedList<TNode>(TNode)

Creates a singleton separated list.

SkipClause(ExpressionSyntax)

Represents a "Skip" or "Take" query operator. The Kind property tells which.

SkipClause(SyntaxToken, ExpressionSyntax)

Represents a "Skip" or "Take" query operator. The Kind property tells which.

SkippedTokensTrivia()

Represents tokens that were skipped by the parser as part of error recovery, and thus are not part of any syntactic structure.

SkippedTokensTrivia(SyntaxTokenList)

Represents tokens that were skipped by the parser as part of error recovery, and thus are not part of any syntactic structure.

SkipWhileClause(ExpressionSyntax)

Represents a "Skip While" or "Take While" query operator. The Kind property tells which.

SkipWhileClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a "Skip While" or "Take While" query operator. The Kind property tells which.

SpecialConstraint(SyntaxKind, SyntaxToken)

One of the special type parameter constraints: New, Class or Structure. Which kind of special constraint it is can be obtained from the Kind property and is one of: NewConstraint, ReferenceConstraint or ValueConstraint.

StopOrEndStatement(SyntaxKind, SyntaxToken)

Represents a "Stop" or "End" statement. The Kind can be used to determine which kind of statement this is.

StopStatement(SyntaxToken)

Represents a "Stop" or "End" statement. The Kind can be used to determine which kind of statement this is.

StringLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

StringLiteralToken(String, String)

Represents a string literal token.

StringLiteralToken(SyntaxTriviaList, String, String, SyntaxTriviaList)

Represents a string literal token.

StructureBlock(StructureStatementSyntax)

Represents a declaration of a Structure, its contents and the End statement that ends it.

StructureBlock(StructureStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>)

Represents a declaration of a Structure, its contents and the End statement that ends it.

StructureBlock(StructureStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a declaration of a Structure, its contents and the End statement that ends it.

StructureConstraint(SyntaxToken)

One of the special type parameter constraints: New, Class or Structure. Which kind of special constraint it is can be obtained from the Kind property and is one of: NewConstraint, ReferenceConstraint or ValueConstraint.

StructureStatement(String)

Represents the beginning statement of a Structure declaration. This node always appears as the Begin of a TypeBlock with Kind=StructureDeclarationBlock.

StructureStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Structure declaration. This node always appears as the Begin of a TypeBlock with Kind=StructureDeclarationBlock.

StructureStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax)

Represents the beginning statement of a Structure declaration. This node always appears as the Begin of a TypeBlock with Kind=StructureDeclarationBlock.

StructureStatement(SyntaxToken)

Represents the beginning statement of a Structure declaration. This node always appears as the Begin of a TypeBlock with Kind=StructureDeclarationBlock.

SubBlock(MethodStatementSyntax)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

SubBlock(MethodStatementSyntax, SyntaxList<StatementSyntax>)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

SubBlock(MethodStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a Function or Sub block declaration: A declaration that has a beginning declaration, a body of executable statements and an end statement.

SubLambdaHeader()

Represents the header part of a lambda expression

SubLambdaHeader(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax, SimpleAsClauseSyntax)

Represents the header part of a lambda expression

SubLambdaHeader(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, ParameterListSyntax, SimpleAsClauseSyntax)

Represents the header part of a lambda expression

SubNewStatement()

A statement that declares a constructor. This statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubNewStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, ParameterListSyntax)

A statement that declares a constructor. This statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubNewStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, ParameterListSyntax)

A statement that declares a constructor. This statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubStatement(String)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax, HandlesClauseSyntax, ImplementsClauseSyntax)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubStatement(SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, TypeParameterListSyntax, ParameterListSyntax, SimpleAsClauseSyntax, HandlesClauseSyntax, ImplementsClauseSyntax)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubStatement(SyntaxToken)

The statement that declares a Sub or Function. If this method has a body, this statement will be the Begin of a BlockStatement with Kind=MethodDeclarationBlock, and the body of the method will be the Body of that BlockStatement.

SubtractAssignmentStatement(ExpressionSyntax, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

SubtractAssignmentStatement(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a simple, compound, or Mid assignment statement. Which one can be determined by checking the Kind.

SubtractExpression(ExpressionSyntax, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

SubtractExpression(ExpressionSyntax, SyntaxToken, ExpressionSyntax)

Represents a binary operator. The Kind property classifies the operators into similar kind of operators (arithmetic, relational, logical or string); the exact operation being performed is determined by the Operator property.

SyncLockBlock(SyncLockStatementSyntax)

Represents a entire SyncLock...End SyncLock block, including the SyncLock statement, the enclosed statements, and the End SyncLock statement.

SyncLockBlock(SyncLockStatementSyntax, SyntaxList<StatementSyntax>)

Represents a entire SyncLock...End SyncLock block, including the SyncLock statement, the enclosed statements, and the End SyncLock statement.

SyncLockBlock(SyncLockStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a entire SyncLock...End SyncLock block, including the SyncLock statement, the enclosed statements, and the End SyncLock statement.

SyncLockStatement(ExpressionSyntax)

Represents the "SyncLock" statement. This statement always occurs as the Begin of a SyncLockBlock.

SyncLockStatement(SyntaxToken, ExpressionSyntax)

Represents the "SyncLock" statement. This statement always occurs as the Begin of a SyncLockBlock.

SyntaxTree(SyntaxNode, ParseOptions, String, Encoding)

Create a new syntax tree from a syntax node.

SyntaxTrivia(SyntaxKind, String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

TakeClause(ExpressionSyntax)

Represents a "Skip" or "Take" query operator. The Kind property tells which.

TakeClause(SyntaxToken, ExpressionSyntax)

Represents a "Skip" or "Take" query operator. The Kind property tells which.

TakeWhileClause(ExpressionSyntax)

Represents a "Skip While" or "Take While" query operator. The Kind property tells which.

TakeWhileClause(SyntaxToken, SyntaxToken, ExpressionSyntax)

Represents a "Skip While" or "Take While" query operator. The Kind property tells which.

TernaryConditionalExpression(ExpressionSyntax, ExpressionSyntax, ExpressionSyntax)

Represents a conditional expression, If(condition, true-expr, false-expr) or If(expr, nothing-expr).

TernaryConditionalExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax, SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents a conditional expression, If(condition, true-expr, false-expr) or If(expr, nothing-expr).

ThrowStatement()

Represents a Throw statement.

ThrowStatement(ExpressionSyntax)

Represents a Throw statement.

ThrowStatement(SyntaxToken, ExpressionSyntax)

Represents a Throw statement.

Token(SyntaxKind, String)
Token(SyntaxKind, SyntaxTriviaList, String)
Token(SyntaxTriviaList, SyntaxKind, String)
Token(SyntaxTriviaList, SyntaxKind, SyntaxTriviaList, String)
TokenList()

Creates an empty list of tokens.

TokenList(IEnumerable<SyntaxToken>)

Creates a list of tokens.

TokenList(SyntaxToken)

Creates a singleton list of tokens.

TokenList(SyntaxToken[])

Creates a list of tokens.

Trivia(StructuredTriviaSyntax)
TriviaList()

Creates an empty list of trivia.

TriviaList(IEnumerable<SyntaxTrivia>)

Creates a list of trivia.

TriviaList(SyntaxTrivia)

Creates a singleton list of trivia.

TriviaList(SyntaxTrivia[])

Creates a list of trivia.

TrueLiteralExpression(SyntaxToken)

Represents a literal. The kind of literal is determined by the Kind property: IntegerLiteral, CharacterLiteral, BooleanLiteral, DecimalLiteral, FloatingLiteral, DateLiteral or StringLiteral. The value of the literal can be determined by casting the associated Token to the correct type and getting the value from the token.

TryBlock()

Represents a "Try ... Catch ... Finally ... End Try" block.

TryBlock(SyntaxList<StatementSyntax>, SyntaxList<CatchBlockSyntax>, FinallyBlockSyntax)

Represents a "Try ... Catch ... Finally ... End Try" block.

TryBlock(TryStatementSyntax, SyntaxList<StatementSyntax>, SyntaxList<CatchBlockSyntax>, FinallyBlockSyntax, EndBlockStatementSyntax)

Represents a "Try ... Catch ... Finally ... End Try" block.

TryCastExpression(ExpressionSyntax, TypeSyntax)
TryCastExpression(SyntaxToken, SyntaxToken, ExpressionSyntax, SyntaxToken, TypeSyntax, SyntaxToken)
TryStatement()

Represents the "Try" statement that begins a "Try" block.

TryStatement(SyntaxToken)

Represents the "Try" statement that begins a "Try" block.

TupleExpression(SeparatedSyntaxList<SimpleArgumentSyntax>)

Represents a tuple literal expression.

TupleExpression(SimpleArgumentSyntax[])

Represents a tuple literal expression.

TupleExpression(SyntaxToken, SeparatedSyntaxList<SimpleArgumentSyntax>, SyntaxToken)

Represents a tuple literal expression.

TupleType(SeparatedSyntaxList<TupleElementSyntax>)

Represents a tuple type expression.

TupleType(SyntaxToken, SeparatedSyntaxList<TupleElementSyntax>, SyntaxToken)

Represents a tuple type expression.

TupleType(TupleElementSyntax[])

Represents a tuple type expression.

TypeArgumentList(SeparatedSyntaxList<TypeSyntax>)

Represents a parenthesized list of generic type arguments.

TypeArgumentList(SyntaxToken, SyntaxToken, SeparatedSyntaxList<TypeSyntax>, SyntaxToken)

Represents a parenthesized list of generic type arguments.

TypeArgumentList(TypeSyntax[])

Represents a parenthesized list of generic type arguments.

TypeBlock(SyntaxKind, TypeStatementSyntax, SyntaxList<InheritsStatementSyntax>, SyntaxList<ImplementsStatementSyntax>, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)
TypeConstraint(TypeSyntax)

Represents a type parameter constraint that is a type.

TypedTupleElement(TypeSyntax)

Represents a single declaration of a tuple element supplying only the type.

TypeOfExpression(SyntaxKind, ExpressionSyntax, SyntaxToken, TypeSyntax)

Represents a TypeOf...Is or IsNot expression.

TypeOfExpression(SyntaxKind, SyntaxToken, ExpressionSyntax, SyntaxToken, TypeSyntax)

Represents a TypeOf...Is or IsNot expression.

TypeOfIsExpression(ExpressionSyntax, TypeSyntax)

Represents a TypeOf...Is or IsNot expression.

TypeOfIsExpression(SyntaxToken, ExpressionSyntax, SyntaxToken, TypeSyntax)

Represents a TypeOf...Is or IsNot expression.

TypeOfIsNotExpression(ExpressionSyntax, TypeSyntax)

Represents a TypeOf...Is or IsNot expression.

TypeOfIsNotExpression(SyntaxToken, ExpressionSyntax, SyntaxToken, TypeSyntax)

Represents a TypeOf...Is or IsNot expression.

TypeParameter(String)

Represents a type parameter on a generic type declaration.

TypeParameter(SyntaxToken)

Represents a type parameter on a generic type declaration.

TypeParameter(SyntaxToken, SyntaxToken, TypeParameterConstraintClauseSyntax)

Represents a type parameter on a generic type declaration.

TypeParameterList(SeparatedSyntaxList<TypeParameterSyntax>)

Represents the type parameter list in a declaration.

TypeParameterList(SyntaxToken, SyntaxToken, SeparatedSyntaxList<TypeParameterSyntax>, SyntaxToken)

Represents the type parameter list in a declaration.

TypeParameterList(TypeParameterSyntax[])

Represents the type parameter list in a declaration.

TypeParameterMultipleConstraintClause(ConstraintSyntax[])

One of the type parameter constraints clauses. This represents a constraint clause in the form of "As { Constraints }".

TypeParameterMultipleConstraintClause(SeparatedSyntaxList<ConstraintSyntax>)

One of the type parameter constraints clauses. This represents a constraint clause in the form of "As { Constraints }".

TypeParameterMultipleConstraintClause(SyntaxToken, SyntaxToken, SeparatedSyntaxList<ConstraintSyntax>, SyntaxToken)

One of the type parameter constraints clauses. This represents a constraint clause in the form of "As { Constraints }".

TypeParameterSingleConstraintClause(ConstraintSyntax)

One of the type parameter constraints clauses. This represents a constraint clause in the form of "As Constraint".

TypeParameterSingleConstraintClause(SyntaxToken, ConstraintSyntax)

One of the type parameter constraints clauses. This represents a constraint clause in the form of "As Constraint".

TypeStatement(SyntaxKind, SyntaxList<AttributeListSyntax>, SyntaxTokenList, SyntaxToken, SyntaxToken, TypeParameterListSyntax)
UnaryExpression(SyntaxKind, SyntaxToken, ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

UnaryMinusExpression(ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

UnaryMinusExpression(SyntaxToken, ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

UnaryPlusExpression(ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

UnaryPlusExpression(SyntaxToken, ExpressionSyntax)

Describes a unary operator: Plus, Negate, Not or AddressOf.

UntilClause(ExpressionSyntax)

Represents a "While expression" or "Until expression" in a Do or Loop statement. The Kind of the clause can be "WhileClause" or "UntilClause" to indicate which kind of clause.

UntilClause(SyntaxToken, ExpressionSyntax)

Represents a "While expression" or "Until expression" in a Do or Loop statement. The Kind of the clause can be "WhileClause" or "UntilClause" to indicate which kind of clause.

UsingBlock(UsingStatementSyntax)

Represents an entire Using...End Using statement, including the Using, body and End Using statements.

UsingBlock(UsingStatementSyntax, SyntaxList<StatementSyntax>)

Represents an entire Using...End Using statement, including the Using, body and End Using statements.

UsingBlock(UsingStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents an entire Using...End Using statement, including the Using, body and End Using statements.

UsingStatement()

The Using statement that begins a Using block. This statement always occurs as the Begin of a UsingBlock, and the body of the Using is the Body of that UsingBlock.

UsingStatement(ExpressionSyntax, SeparatedSyntaxList<VariableDeclaratorSyntax>)

The Using statement that begins a Using block. This statement always occurs as the Begin of a UsingBlock, and the body of the Using is the Body of that UsingBlock.

UsingStatement(SyntaxToken, ExpressionSyntax, SeparatedSyntaxList<VariableDeclaratorSyntax>)

The Using statement that begins a Using block. This statement always occurs as the Begin of a UsingBlock, and the body of the Using is the Body of that UsingBlock.

VariableDeclarator(ModifiedIdentifierSyntax[])

Represents the part of a variable or constant declaration statement that associated one or more variable names with a type.

VariableDeclarator(SeparatedSyntaxList<ModifiedIdentifierSyntax>)

Represents the part of a variable or constant declaration statement that associated one or more variable names with a type.

VariableDeclarator(SeparatedSyntaxList<ModifiedIdentifierSyntax>, AsClauseSyntax, EqualsValueSyntax)

Represents the part of a variable or constant declaration statement that associated one or more variable names with a type.

VariableNameEquals(ModifiedIdentifierSyntax)

Represents the name and optional type of an expression range variable.

VariableNameEquals(ModifiedIdentifierSyntax, SimpleAsClauseSyntax)

Represents the name and optional type of an expression range variable.

VariableNameEquals(ModifiedIdentifierSyntax, SimpleAsClauseSyntax, SyntaxToken)

Represents the name and optional type of an expression range variable.

WhereClause(ExpressionSyntax)

Represents a "Where" query operator.

WhereClause(SyntaxToken, ExpressionSyntax)

Represents a "Where" query operator.

WhileBlock(WhileStatementSyntax)

Represents a While...End While statement, including the While, body and End While.

WhileBlock(WhileStatementSyntax, SyntaxList<StatementSyntax>)

Represents a While...End While statement, including the While, body and End While.

WhileBlock(WhileStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a While...End While statement, including the While, body and End While.

WhileClause(ExpressionSyntax)

Represents a "While expression" or "Until expression" in a Do or Loop statement. The Kind of the clause can be "WhileClause" or "UntilClause" to indicate which kind of clause.

WhileClause(SyntaxToken, ExpressionSyntax)

Represents a "While expression" or "Until expression" in a Do or Loop statement. The Kind of the clause can be "WhileClause" or "UntilClause" to indicate which kind of clause.

WhileOrUntilClause(SyntaxKind, SyntaxToken, ExpressionSyntax)

Represents a "While expression" or "Until expression" in a Do or Loop statement. The Kind of the clause can be "WhileClause" or "UntilClause" to indicate which kind of clause.

WhileStatement(ExpressionSyntax)

The While statement that begins a While...End While block. This statement always occurs as the Begin of a WhileBlock.

WhileStatement(SyntaxToken, ExpressionSyntax)

The While statement that begins a While...End While block. This statement always occurs as the Begin of a WhileBlock.

Whitespace(String)

Creates a trivia with kind WhitespaceTrivia containing the specified text.

Whitespace(String, Boolean)
WhitespaceTrivia(String)

Trivia nodes represents parts of the program text that are not parts of the syntactic grammar, such as spaces, newlines, comments, preprocessors directives, and disabled code.

WithBlock(WithStatementSyntax)

Represents a With...End With block, include the With statement, the body of the block and the End With statement.

WithBlock(WithStatementSyntax, SyntaxList<StatementSyntax>)

Represents a With...End With block, include the With statement, the body of the block and the End With statement.

WithBlock(WithStatementSyntax, SyntaxList<StatementSyntax>, EndBlockStatementSyntax)

Represents a With...End With block, include the With statement, the body of the block and the End With statement.

WithEventsEventContainer(String)

Represents event container that refers to a WithEvents member.

WithEventsEventContainer(SyntaxToken)

Represents event container that refers to a WithEvents member.

WithEventsPropertyEventContainer(WithEventsEventContainerSyntax, IdentifierNameSyntax)

Represents event container that refers to a WithEvents member's property.

WithEventsPropertyEventContainer(WithEventsEventContainerSyntax, SyntaxToken, IdentifierNameSyntax)

Represents event container that refers to a WithEvents member's property.

WithStatement(ExpressionSyntax)

Represents a "With" statement. This statement always occurs as the BeginStatement of a WithBlock, and the body of the With is the Body of that WithBlock.

WithStatement(SyntaxToken, ExpressionSyntax)

Represents a "With" statement. This statement always occurs as the BeginStatement of a WithBlock, and the body of the With is the Body of that WithBlock.

XmlAttribute(XmlNodeSyntax, SyntaxToken, XmlNodeSyntax)

Represents an XML attribute in an XML literal expression.

XmlAttribute(XmlNodeSyntax, XmlNodeSyntax)

Represents an XML attribute in an XML literal expression.

XmlAttributeAccessExpression(ExpressionSyntax, SyntaxToken, SyntaxToken, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlAttributeAccessExpression(ExpressionSyntax, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlAttributeAccessExpression(XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlBracketedName(SyntaxToken, XmlNameSyntax, SyntaxToken)

Represents an XML name of the form <xml-name> appearing in source as part of an XML literal or member access expression or an XML namespace import clause.

XmlBracketedName(XmlNameSyntax)

Represents an XML name of the form <xml-name> appearing in source as part of an XML literal or member access expression or an XML namespace import clause.

XmlCDataSection()

Represents an XML CDATA section in an XML literal expression.

XmlCDataSection(SyntaxToken, SyntaxTokenList, SyntaxToken)

Represents an XML CDATA section in an XML literal expression.

XmlComment()

Represents an XML comment of the form <!-- Comment --> appearing in an XML literal expression.

XmlComment(SyntaxToken, SyntaxTokenList, SyntaxToken)

Represents an XML comment of the form <!-- Comment --> appearing in an XML literal expression.

XmlCrefAttribute(CrefReferenceSyntax)

Creates a syntax node for a cref attribute within a xml documentation comment.

XmlCrefAttribute(CrefReferenceSyntax, SyntaxKind)

Creates a syntax node for a cref attribute within a xml documentation comment.

XmlCrefAttribute(XmlNameSyntax, SyntaxToken, CrefReferenceSyntax, SyntaxToken)

A symbol referenced by a cref attribute (e.g. in a <see> or <seealso> documentation comment tag). For example, the M in <see cref="M" />.

XmlCrefAttribute(XmlNameSyntax, SyntaxToken, SyntaxToken, CrefReferenceSyntax, SyntaxToken)

A symbol referenced by a cref attribute (e.g. in a <see> or <seealso> documentation comment tag). For example, the M in <see cref="M" />.

XmlDeclaration(SyntaxToken, SyntaxToken, XmlDeclarationOptionSyntax, XmlDeclarationOptionSyntax, XmlDeclarationOptionSyntax, SyntaxToken)

Represents the XML declaration prologue in an XML literal expression.

XmlDeclaration(XmlDeclarationOptionSyntax)

Represents the XML declaration prologue in an XML literal expression.

XmlDeclaration(XmlDeclarationOptionSyntax, XmlDeclarationOptionSyntax, XmlDeclarationOptionSyntax)

Represents the XML declaration prologue in an XML literal expression.

XmlDeclarationOption(SyntaxToken, SyntaxToken, XmlStringSyntax)

Represents an XML document prologue option - version, encoding, standalone or whitespace in an XML literal expression.

XmlDeclarationOption(XmlStringSyntax)

Represents an XML document prologue option - version, encoding, standalone or whitespace in an XML literal expression.

XmlDescendantAccessExpression(ExpressionSyntax, SyntaxToken, SyntaxToken, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlDescendantAccessExpression(ExpressionSyntax, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlDescendantAccessExpression(XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlDocument(XmlDeclarationSyntax, SyntaxList<XmlNodeSyntax>, XmlNodeSyntax, SyntaxList<XmlNodeSyntax>)

Represents an XML Document literal expression.

XmlDocument(XmlDeclarationSyntax, XmlNodeSyntax)

Represents an XML Document literal expression.

XmlElement(String, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of a named xml element within xml documentation comments.

XmlElement(XmlElementStartTagSyntax, SyntaxList<XmlNodeSyntax>, XmlElementEndTagSyntax)

Represents an XML element with content in an XML literal expression.

XmlElement(XmlElementStartTagSyntax, XmlElementEndTagSyntax)

Represents an XML element with content in an XML literal expression.

XmlElement(XmlNameSyntax, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of a named xml element within xml documentation comments.

XmlElementAccessExpression(ExpressionSyntax, SyntaxToken, SyntaxToken, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlElementAccessExpression(ExpressionSyntax, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlElementAccessExpression(XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlElementEndTag()

Represents the end tag of an XML element of the form </element>.

XmlElementEndTag(SyntaxToken, XmlNameSyntax, SyntaxToken)

Represents the end tag of an XML element of the form </element>.

XmlElementEndTag(XmlNameSyntax)

Represents the end tag of an XML element of the form </element>.

XmlElementStartTag(SyntaxToken, XmlNodeSyntax, SyntaxList<XmlNodeSyntax>, SyntaxToken)

Represents the start tag of an XML element of the form <element>.

XmlElementStartTag(XmlNodeSyntax)

Represents the start tag of an XML element of the form <element>.

XmlElementStartTag(XmlNodeSyntax, SyntaxList<XmlNodeSyntax>)

Represents the start tag of an XML element of the form <element>.

XmlEmbeddedExpression(ExpressionSyntax)

Represents an embedded expression in an XML literal e.g. '<name><%= obj.Name =%></name>'.

XmlEmbeddedExpression(SyntaxToken, ExpressionSyntax, SyntaxToken)

Represents an embedded expression in an XML literal e.g. '<name><%= obj.Name =%></name>'.

XmlEmptyElement(String)

Creates the syntax representation of a named empty xml element within xml documentation comments.

XmlEmptyElement(SyntaxToken, XmlNodeSyntax, SyntaxList<XmlNodeSyntax>, SyntaxToken)

Represents an empty XML element of the form <element />

XmlEmptyElement(XmlNodeSyntax)

Represents an empty XML element of the form <element />

XmlEmptyElement(XmlNodeSyntax, SyntaxList<XmlNodeSyntax>)

Represents an empty XML element of the form <element />

XmlEntityLiteralToken(String, String)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

XmlEntityLiteralToken(SyntaxTriviaList, String, String, SyntaxTriviaList)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

XmlExampleElement(SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of an example element within xml documentation comments.

XmlExampleElement(XmlNodeSyntax[])

Creates the syntax representation of an example element within xml documentation comments.

XmlExceptionElement(CrefReferenceSyntax, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of an exception element within xml documentation comments.

XmlExceptionElement(CrefReferenceSyntax, XmlNodeSyntax[])

Creates the syntax representation of an exception element within xml documentation comments.

XmlMemberAccessExpression(SyntaxKind, ExpressionSyntax, SyntaxToken, SyntaxToken, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlMemberAccessExpression(SyntaxKind, ExpressionSyntax, SyntaxToken, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlMemberAccessExpression(SyntaxKind, XmlNodeSyntax)

Represents an XML member element access (node.<Element>), attribute access (node.@Attribute) or descendants access (node...<Descendant>). The Kind property determines which kind of access.

XmlMultiLineElement(String, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of an xml element that spans multiple text lines.

XmlMultiLineElement(XmlNameSyntax, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of an xml element that spans multiple text lines.

XmlName()

Represents an XML name of the form 'name' or 'namespace:name' appearing in source as part of an XML literal or member access expression or an XML namespace import clause.

XmlName(XmlPrefixSyntax, SyntaxToken)

Represents an XML name of the form 'name' or 'namespace:name' appearing in source as part of an XML literal or member access expression or an XML namespace import clause.

XmlNameAttribute(String)

Creates a syntax node for a name attribute in a xml element within a xml documentation comment.

XmlNameAttribute(XmlNameSyntax, SyntaxToken, IdentifierNameSyntax, SyntaxToken)

A param or type param symbol referenced by a name attribute (e.g. in a <param> or <typeparam> documentation comment tag). For example, the M in <param name="M" />.

XmlNameAttribute(XmlNameSyntax, SyntaxToken, SyntaxToken, IdentifierNameSyntax, SyntaxToken)

A param or type param symbol referenced by a name attribute (e.g. in a <param> or <typeparam> documentation comment tag). For example, the M in <param name="M" />.

XmlNamespaceImportsClause(SyntaxToken, XmlAttributeSyntax, SyntaxToken)

Defines a XML namespace for XML expressions.

XmlNamespaceImportsClause(XmlAttributeSyntax)

Defines a XML namespace for XML expressions.

XmlNameToken(String, SyntaxKind)

Represents an Xml NCName per Namespaces in XML 1.0

XmlNameToken(SyntaxTriviaList, String, SyntaxKind, SyntaxTriviaList)

Represents an Xml NCName per Namespaces in XML 1.0

XmlNewLine(String)

Creates the syntax representation of an xml text that contains a newline token with a documentation comment exterior trivia at the end (continued documentation comment).

XmlNullKeywordElement()

Creates the syntax representation of a see element within xml documentation comments, that points to the 'null' language keyword.

XmlParaElement(SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of a para element within xml documentation comments.

XmlParaElement(XmlNodeSyntax[])

Creates the syntax representation of a para element within xml documentation comments.

XmlParamElement(String, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of a param element within xml documentation comments (e.g. for documentation of method parameters).

XmlParamElement(String, XmlNodeSyntax[])

Creates the syntax representation of a param element within xml documentation comments (e.g. for documentation of method parameters).

XmlParamRefElement(String)

Creates the syntax representation of a paramref element within xml documentation comments (e.g. for referencing particular parameters of a method).

XmlPermissionElement(CrefReferenceSyntax, SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of a permission element within xml documentation comments.

XmlPermissionElement(CrefReferenceSyntax, XmlNodeSyntax[])

Creates the syntax representation of a permission element within xml documentation comments.

XmlPlaceholderElement(SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of a placeholder element within xml documentation comments.

XmlPlaceholderElement(XmlNodeSyntax[])

Creates the syntax representation of a placeholder element within xml documentation comments.

XmlPrefix()

Represents an XML namespace prefix of the form 'prefix:' as in xml:ns="".

XmlPrefix(SyntaxToken, SyntaxToken)

Represents an XML namespace prefix of the form 'prefix:' as in xml:ns="".

XmlPrefixName()

Represents an XML name of the form 'name' appearing in GetXmlNamespace().

XmlPrefixName(SyntaxToken)

Represents an XML name of the form 'name' appearing in GetXmlNamespace().

XmlPreliminaryElement()

Creates a syntax node for a preliminary element within a xml documentation comment.

XmlProcessingInstruction()

Represents an XML processing instruction of the form '<? XMLProcessingTarget XMLProcessingValue ?>'.

XmlProcessingInstruction(SyntaxToken, SyntaxToken, SyntaxTokenList, SyntaxToken)

Represents an XML processing instruction of the form '<? XMLProcessingTarget XMLProcessingValue ?>'.

XmlRemarksElement(SyntaxList<XmlNodeSyntax>)

Creates a remarks element within an xml documentation comment.

XmlRemarksElement(XmlNodeSyntax[])

Creates a remarks element within an xml documentation comment.

XmlReturnsElement(SyntaxList<XmlNodeSyntax>)

Creates a returns element within an xml documentation comment.

XmlReturnsElement(XmlNodeSyntax[])

Creates a returns element within an xml documentation comment.

XmlSeeAlsoElement(CrefReferenceSyntax)

Creates a seealso element within an xml documentation comment.

XmlSeeAlsoElement(Uri, SyntaxList<XmlNodeSyntax>)

Creates a seealso element within an xml documentation comment.

XmlSeeElement(CrefReferenceSyntax)

Creates a see element within an xml documentation comment.

XmlString(SyntaxToken, SyntaxToken)

Represents a string of XML characters embedded as the content of an XML element.

XmlString(SyntaxToken, SyntaxTokenList, SyntaxToken)

Represents a string of XML characters embedded as the content of an XML element.

XmlSummaryElement(SyntaxList<XmlNodeSyntax>)

Creates a summary element within an xml documentation comment.

XmlSummaryElement(XmlNodeSyntax[])

Creates a summary element within an xml documentation comment.

XmlText()

Represents Xml text.

XmlText(String)

Generates the syntax representation of a xml text node (e.g. for xml documentation comments).

XmlText(SyntaxToken[])

Generates the syntax representation of a xml text node (e.g. for xml documentation comments).

XmlText(SyntaxTokenList)

Represents Xml text.

XmlTextLiteral(String)

Generates the syntax representation of an xml text literal.

XmlTextLiteral(String, String)

Generates the syntax representation of an xml text literal.

XmlTextLiteralToken(String, String)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

XmlTextLiteralToken(SyntaxTriviaList, String, String, SyntaxTriviaList)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

XmlTextNewLine(String)

Creates the syntax representation of an xml newline token with a documentation comment exterior trivia at the end (continued documentation comment).

XmlTextNewLine(String, Boolean)

Creates the syntax representation of an xml newline token for xml documentation comments.

XmlTextNewLine(String, String, SyntaxTriviaList, SyntaxTriviaList)

Creates a token with kind XmlTextLiteralNewLineToken.

XmlTextToken(SyntaxKind, String, String)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

XmlTextToken(SyntaxTriviaList, SyntaxKind, String, String, SyntaxTriviaList)

Represents character data in Xml content also known as PCData or in an Xml attribute value. All text is here for now even text that does not need normalization such as comment, pi and cdata text.

XmlThreadSafetyElement()

Creates a threadsafety element within an xml documentation comment.

XmlThreadSafetyElement(Boolean, Boolean)

Creates a threadsafety element within an xml documentation comment.

XmlValueElement(SyntaxList<XmlNodeSyntax>)

Creates the syntax representation of an xml value element (e.g. for xml documentation comments).

XmlValueElement(XmlNodeSyntax[])

Creates the syntax representation of an xml value element (e.g. for xml documentation comments).

YieldStatement(ExpressionSyntax)

Represent a Yield statement.

YieldStatement(SyntaxToken, ExpressionSyntax)

Represent a Yield statement.

Applies to