hydra-0.8.0: Type-aware transformations for data and programs
Safe HaskellSafe-Inferred
LanguageHaskell2010

Hydra.Ext.Csharp.Syntax

Description

A C# syntax module based on the ANTLR grammar dated 02072024 and available at: | https://learn.microsoft.com/en-us/dotnet/csharp/language-reference/language-specification/grammar

Documentation

newtype Keyword Source #

Constructors

Keyword 

Fields

Instances

Instances details
Read Keyword Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show Keyword Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq Keyword Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

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

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

Ord Keyword Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data IdentifierNamespaceOrTypeName Source #

Instances

Instances details
Read IdentifierNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show IdentifierNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq IdentifierNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord IdentifierNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data QualifiedNamespaceOrTypeName Source #

Instances

Instances details
Read QualifiedNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show QualifiedNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq QualifiedNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord QualifiedNamespaceOrTypeName Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data Type Source #

Instances

Instances details
Read Type Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show Type Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Eq Type Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

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

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

Ord Type Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

compare :: Type -> Type -> Ordering #

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

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

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

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

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

newtype EnumType Source #

Constructors

EnumType 

Fields

data PrimaryNoArrayCreationExpression Source #

Constructors

PrimaryNoArrayCreationExpressionLiteral Literal 
PrimaryNoArrayCreationExpressionInterpolatedString InterpolatedStringExpression 
PrimaryNoArrayCreationExpressionSimpleName SimpleName 
PrimaryNoArrayCreationExpressionParenthesized Expression 
PrimaryNoArrayCreationExpressionTuple TupleExpression 
PrimaryNoArrayCreationExpressionMemberAccess MemberAccess 
PrimaryNoArrayCreationExpressionNullConditionalMemberAccess NullConditionalMemberAccess 
PrimaryNoArrayCreationExpressionInvocation InvocationExpression 
PrimaryNoArrayCreationExpressionElementAccess ElementAccess 
PrimaryNoArrayCreationExpressionNullConditionalElementAccess NullConditionalElementAccess 
PrimaryNoArrayCreationExpressionThisAccess 
PrimaryNoArrayCreationExpressionBaseAccess BaseAccess 
PrimaryNoArrayCreationExpressionPostIncrement PrimaryExpression 
PrimaryNoArrayCreationExpressionPostDecrement PrimaryExpression 
PrimaryNoArrayCreationExpressionObjectCreation ObjectCreationExpression 
PrimaryNoArrayCreationExpressionDelegateCreation DelegateCreationExpression 
PrimaryNoArrayCreationExpressionAnonymousObjectCreation (Maybe MemberDeclaratorList) 
PrimaryNoArrayCreationExpressionTypeof TypeofExpression 
PrimaryNoArrayCreationExpressionSizeof UnmanagedType 
PrimaryNoArrayCreationExpressionChecked Expression 
PrimaryNoArrayCreationExpressionUnchecked Expression 
PrimaryNoArrayCreationExpressionDefaultValue DefaultValueExpression 
PrimaryNoArrayCreationExpressionNameof NamedEntity 
PrimaryNoArrayCreationExpressionAnonymousMethod AnonymousMethodExpression 
PrimaryNoArrayCreationExpressionPointerMemberAccess PointerMemberAccess 
PrimaryNoArrayCreationExpressionPointerElementAccess PointerElementAccess 
PrimaryNoArrayCreationExpressionStackalloc StackallocExpression 

Instances

Instances details
Read PrimaryNoArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show PrimaryNoArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq PrimaryNoArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord PrimaryNoArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data InterpolatedStringExpression Source #

Instances

Instances details
Read InterpolatedStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show InterpolatedStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq InterpolatedStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord InterpolatedStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

newtype InterpolatedRegularStringExpression Source #

Instances

Instances details
Read InterpolatedRegularStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show InterpolatedRegularStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq InterpolatedRegularStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord InterpolatedRegularStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RegularInterpolation Source #

newtype InterpolatedVerbatimStringExpression Source #

Instances

Instances details
Read InterpolatedVerbatimStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show InterpolatedVerbatimStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq InterpolatedVerbatimStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord InterpolatedVerbatimStringExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data VerbatimInterpolation Source #

data NullConditionalMemberAccess Source #

Instances

Instances details
Read NullConditionalMemberAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show NullConditionalMemberAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq NullConditionalMemberAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord NullConditionalMemberAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data DependentAccessForMember Source #

data NullConditionalProjectionInitializer Source #

Instances

Instances details
Read NullConditionalProjectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show NullConditionalProjectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq NullConditionalProjectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord NullConditionalProjectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data NullConditionalInvocationExpression Source #

Instances

Instances details
Read NullConditionalInvocationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show NullConditionalInvocationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq NullConditionalInvocationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord NullConditionalInvocationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data NullConditionalInvocationExpressionHead Source #

Instances

Instances details
Read NullConditionalInvocationExpressionHead Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show NullConditionalInvocationExpressionHead Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq NullConditionalInvocationExpressionHead Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord NullConditionalInvocationExpressionHead Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data NullConditionalElementAccess Source #

Instances

Instances details
Read NullConditionalElementAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show NullConditionalElementAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq NullConditionalElementAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord NullConditionalElementAccess Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data BaseAccessWithIdentifier Source #

data ObjectCreationExpression Source #

data ObjectOrCollectionInitializer Source #

Instances

Instances details
Read ObjectOrCollectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ObjectOrCollectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ObjectOrCollectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ObjectOrCollectionInitializer Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ArrayCreationExpression Source #

data NonArrayTypeArrayCreationExpression Source #

Instances

Instances details
Read NonArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show NonArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq NonArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord NonArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ArrayTypeArrayCreationExpression Source #

Instances

Instances details
Read ArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ArrayTypeArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RankSpecifierArrayCreationExpression Source #

Instances

Instances details
Read RankSpecifierArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show RankSpecifierArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq RankSpecifierArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord RankSpecifierArrayCreationExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data DelegateCreationExpression Source #

data AssignmentMemberDeclarator Source #

data DefaultValueExpression Source #

data StackallocExpression Source #

data UnaryExpression Source #

data MultiplicativeExpression Source #

data BinaryMultiplicativeExpression Source #

Instances

Instances details
Read BinaryMultiplicativeExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show BinaryMultiplicativeExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq BinaryMultiplicativeExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord BinaryMultiplicativeExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data MultiplicativeOperator Source #

data BinaryAdditiveExpression Source #

data BinaryShiftExpression Source #

data RelationalExpression Source #

data BinaryRelationalExpression Source #

data BinaryEqualityExpression Source #

data BinaryExclusiveOrExpression Source #

Instances

Instances details
Read BinaryExclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show BinaryExclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq BinaryExclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord BinaryExclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data BinaryInclusiveOrExpression Source #

Instances

Instances details
Read BinaryInclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show BinaryInclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq BinaryInclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord BinaryInclusiveOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ConditionalAndExpression Source #

data BinaryConditionalAndExpression Source #

Instances

Instances details
Read BinaryConditionalAndExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show BinaryConditionalAndExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq BinaryConditionalAndExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord BinaryConditionalAndExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ConditionalOrExpression Source #

data BinaryConditionalOrExpression Source #

Instances

Instances details
Read BinaryConditionalOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show BinaryConditionalOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq BinaryConditionalOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord BinaryConditionalOrExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data NullCoalescingExpression Source #

data BinaryNullCoalescingExpression Source #

Instances

Instances details
Read BinaryNullCoalescingExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show BinaryNullCoalescingExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq BinaryNullCoalescingExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord BinaryNullCoalescingExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data DeclarationExpression Source #

data ConditionalExpression Source #

data SimpleConditionalExpression Source #

Instances

Instances details
Read SimpleConditionalExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show SimpleConditionalExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq SimpleConditionalExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord SimpleConditionalExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RefConditionalExpression Source #

data AnonymousMethodExpression Source #

data AnonymousFunctionSignature Source #

data ExplicitAnonymousFunctionParameter Source #

Instances

Instances details
Read ExplicitAnonymousFunctionParameter Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ExplicitAnonymousFunctionParameter Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ExplicitAnonymousFunctionParameter Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ExplicitAnonymousFunctionParameter Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data AnonymousFunctionParameterModifier Source #

Instances

Instances details
Read AnonymousFunctionParameterModifier Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show AnonymousFunctionParameterModifier Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq AnonymousFunctionParameterModifier Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord AnonymousFunctionParameterModifier Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data AnonymousFunctionBody Source #

data AssignmentOperator Source #

data NonAssignmentExpression Source #

data EmbeddedStatement Source #

newtype Block Source #

Constructors

Block 

Fields

Instances

Instances details
Read Block Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show Block Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

Eq Block Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

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

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

Ord Block Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

compare :: Block -> Block -> Ordering #

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

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

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

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

max :: Block -> Block -> Block #

min :: Block -> Block -> Block #

data DeclarationStatement Source #

data LocalVariableDeclaration Source #

data ImplicitlyTypedLocalVariableDeclaration Source #

Instances

Instances details
Read ImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RefVarImplicitlyTypedLocalVariableDeclaration Source #

Instances

Instances details
Read RefVarImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show RefVarImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq RefVarImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord RefVarImplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ImplicitlyTypedLocalVariableDeclarator Source #

Instances

Instances details
Read ImplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ImplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ImplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ImplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ExplicitlyTypedLocalVariableDeclaration Source #

Instances

Instances details
Read ExplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ExplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ExplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ExplicitlyTypedLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ExplicitlyTypedLocalVariableDeclarator Source #

Instances

Instances details
Read ExplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ExplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ExplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ExplicitlyTypedLocalVariableDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data LocalVariableInitializer Source #

data RefLocalVariableDeclaration Source #

Instances

Instances details
Read RefLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show RefLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq RefLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord RefLocalVariableDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RefLocalVariableDeclarator Source #

data LocalConstantDeclaration Source #

data LocalFunctionDeclaration Source #

data StandardLocalFunctionDeclaration Source #

Instances

Instances details
Read StandardLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show StandardLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq StandardLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord StandardLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RefLocalFunctionDeclaration Source #

Instances

Instances details
Read RefLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show RefLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq RefLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord RefLocalFunctionDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data LocalFunctionHeader Source #

data RefLocalFunctionModifier Source #

data StatementExpression Source #

newtype StatementExpressionList Source #

data SpecificCatchClause Source #

data NamespaceMemberDeclaration Source #

data QualifiedAliasMember Source #

data ClassDeclaration Source #

data TypeParameterConstraintsClause Source #

Instances

Instances details
Read TypeParameterConstraintsClause Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show TypeParameterConstraintsClause Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq TypeParameterConstraintsClause Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord TypeParameterConstraintsClause Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data TypeParameterConstraints Source #

data ClassMemberDeclaration Source #

data ConstantDeclaration Source #

data StandardMethodDeclaration Source #

data RefReturnMethodDeclaration Source #

data RefKind Source #

Instances

Instances details
Read RefKind Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show RefKind Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq RefKind Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Methods

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

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

Ord RefKind Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RefMethodModifier Source #

data StandardPropertyDeclaration Source #

Instances

Instances details
Read StandardPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show StandardPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq StandardPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord StandardPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data RefReturnPropertyDeclaration Source #

Instances

Instances details
Read RefReturnPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show RefReturnPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq RefReturnPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord RefReturnPropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data PropertyModifier Source #

data AccessorDeclaration Source #

data RefGetAccessorDeclaration Source #

data StandardEventDeclaration Source #

data AccessorsEventDeclaration Source #

data EventAccessorDeclarations Source #

data AddRemoveAccessorDeclaration Source #

Instances

Instances details
Read AddRemoveAccessorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show AddRemoveAccessorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq AddRemoveAccessorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord AddRemoveAccessorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data StandardIndexerDeclaration Source #

data RefIndexerDeclaration Source #

data OperatorDeclaration Source #

data UnaryOperatorDeclarator Source #

data OverloadableUnaryOperator Source #

data BinaryOperatorDeclarator Source #

data OverloadableBinaryOperator Source #

data ConversionOperatorDeclarator Source #

Instances

Instances details
Read ConversionOperatorDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show ConversionOperatorDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq ConversionOperatorDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord ConversionOperatorDeclarator Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data ConstructorDeclaration Source #

data ConstructorDeclarator Source #

data ConstructorInitializer Source #

data StaticConstructorDeclaration Source #

Instances

Instances details
Read StaticConstructorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show StaticConstructorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq StaticConstructorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord StaticConstructorDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data StaticConstructorModifiers Source #

data FinalizerDeclaration Source #

data StructDeclaration Source #

data StructMemberDeclaration Source #

data InterfaceDeclaration Source #

data VariantTypeParameter Source #

data InterfaceMemberDeclaration Source #

data InterfaceMethodDeclaration Source #

data InterfaceMethodHeader Source #

data InterfacePropertyDeclaration Source #

Instances

Instances details
Read InterfacePropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show InterfacePropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq InterfacePropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord InterfacePropertyDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data InterfaceEventDeclaration Source #

data InterfaceIndexerDeclaration Source #

Instances

Instances details
Read InterfaceIndexerDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show InterfaceIndexerDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq InterfaceIndexerDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord InterfaceIndexerDeclaration Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data EnumMemberDeclaration Source #

data DelegateDeclaration Source #

data GlobalAttributeSection Source #

newtype PositionalArgumentList Source #

newtype AttributeArgumentExpression Source #

Instances

Instances details
Read AttributeArgumentExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Show AttributeArgumentExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Eq AttributeArgumentExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

Ord AttributeArgumentExpression Source # 
Instance details

Defined in Hydra.Ext.Csharp.Syntax

data PointerMemberAccess Source #

data FixedPointerDeclarator Source #

data FixedSizeBufferDeclaration Source #

data FixedSizeBufferModifier Source #

data FixedSizeBufferDeclarator Source #