| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
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 Identifier Source #
Constructors
| Identifier | |
Fields | |
Instances
| Read Identifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS Identifier # readList :: ReadS [Identifier] # readPrec :: ReadPrec Identifier # readListPrec :: ReadPrec [Identifier] # | |
| Show Identifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> Identifier -> ShowS # show :: Identifier -> String # showList :: [Identifier] -> ShowS # | |
| Eq Identifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord Identifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: Identifier -> Identifier -> Ordering # (<) :: Identifier -> Identifier -> Bool # (<=) :: Identifier -> Identifier -> Bool # (>) :: Identifier -> Identifier -> Bool # (>=) :: Identifier -> Identifier -> Bool # max :: Identifier -> Identifier -> Identifier # min :: Identifier -> Identifier -> Identifier # | |
_Identifier :: Name Source #
Constructors
| LiteralBoolean Bool | |
| LiteralInteger IntegerLiteral | |
| LiteralReal Double | |
| LiteralCharacter String | |
| LiteralString String | |
| LiteralNull |
_Literal_real :: Name Source #
_Literal_null :: Name Source #
data IntegerLiteral Source #
Constructors
| IntegerLiteralDecimal String | |
| IntegerLiteralHexadecimal String | |
| IntegerLiteralBinary Integer |
Instances
| Read IntegerLiteral Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS IntegerLiteral # readList :: ReadS [IntegerLiteral] # | |
| Show IntegerLiteral Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> IntegerLiteral -> ShowS # show :: IntegerLiteral -> String # showList :: [IntegerLiteral] -> ShowS # | |
| Eq IntegerLiteral Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: IntegerLiteral -> IntegerLiteral -> Bool # (/=) :: IntegerLiteral -> IntegerLiteral -> Bool # | |
| Ord IntegerLiteral Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: IntegerLiteral -> IntegerLiteral -> Ordering # (<) :: IntegerLiteral -> IntegerLiteral -> Bool # (<=) :: IntegerLiteral -> IntegerLiteral -> Bool # (>) :: IntegerLiteral -> IntegerLiteral -> Bool # (>=) :: IntegerLiteral -> IntegerLiteral -> Bool # max :: IntegerLiteral -> IntegerLiteral -> IntegerLiteral # min :: IntegerLiteral -> IntegerLiteral -> IntegerLiteral # | |
newtype NamespaceName Source #
Constructors
| NamespaceName | |
Fields | |
Instances
| Read NamespaceName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NamespaceName # readList :: ReadS [NamespaceName] # | |
| Show NamespaceName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NamespaceName -> ShowS # show :: NamespaceName -> String # showList :: [NamespaceName] -> ShowS # | |
| Eq NamespaceName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: NamespaceName -> NamespaceName -> Bool # (/=) :: NamespaceName -> NamespaceName -> Bool # | |
| Ord NamespaceName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NamespaceName -> NamespaceName -> Ordering # (<) :: NamespaceName -> NamespaceName -> Bool # (<=) :: NamespaceName -> NamespaceName -> Bool # (>) :: NamespaceName -> NamespaceName -> Bool # (>=) :: NamespaceName -> NamespaceName -> Bool # max :: NamespaceName -> NamespaceName -> NamespaceName # min :: NamespaceName -> NamespaceName -> NamespaceName # | |
Constructors
| TypeName | |
Fields | |
data NamespaceOrTypeName Source #
Constructors
| NamespaceOrTypeNameIdentifier IdentifierNamespaceOrTypeName | |
| NamespaceOrTypeNameQualified QualifiedNamespaceOrTypeName | |
| NamespaceOrTypeNameAlias QualifiedAliasMember |
Instances
data IdentifierNamespaceOrTypeName Source #
Constructors
| IdentifierNamespaceOrTypeName | |
Instances
data QualifiedNamespaceOrTypeName Source #
Constructors
| QualifiedNamespaceOrTypeName | |
Instances
Constructors
| TypeReference ReferenceType | |
| TypeValue ValueType | |
| TypeParam TypeParameter | |
| TypePointer PointerType |
_Type_value :: Name Source #
_Type_param :: Name Source #
_Type_pointer :: Name Source #
data ReferenceType Source #
Constructors
| ReferenceTypeClass ClassType | |
| ReferenceTypeInterface InterfaceType | |
| ReferenceTypeArray ArrayType | |
| ReferenceTypeDelegate DelegateType | |
| ReferenceTypeDynamic |
Instances
| Read ReferenceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ReferenceType # readList :: ReadS [ReferenceType] # | |
| Show ReferenceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ReferenceType -> ShowS # show :: ReferenceType -> String # showList :: [ReferenceType] -> ShowS # | |
| Eq ReferenceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ReferenceType -> ReferenceType -> Bool # (/=) :: ReferenceType -> ReferenceType -> Bool # | |
| Ord ReferenceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ReferenceType -> ReferenceType -> Ordering # (<) :: ReferenceType -> ReferenceType -> Bool # (<=) :: ReferenceType -> ReferenceType -> Bool # (>) :: ReferenceType -> ReferenceType -> Bool # (>=) :: ReferenceType -> ReferenceType -> Bool # max :: ReferenceType -> ReferenceType -> ReferenceType # min :: ReferenceType -> ReferenceType -> ReferenceType # | |
Constructors
| ClassTypeTypeName TypeName | |
| ClassTypeObject | |
| ClassTypeString |
Instances
| Read ClassType Source # | |
| Show ClassType Source # | |
| Eq ClassType Source # | |
| Ord ClassType Source # | |
_ClassType :: Name Source #
newtype InterfaceType Source #
Constructors
| InterfaceType | |
Fields | |
Instances
| Read InterfaceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS InterfaceType # readList :: ReadS [InterfaceType] # | |
| Show InterfaceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> InterfaceType -> ShowS # show :: InterfaceType -> String # showList :: [InterfaceType] -> ShowS # | |
| Eq InterfaceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: InterfaceType -> InterfaceType -> Bool # (/=) :: InterfaceType -> InterfaceType -> Bool # | |
| Ord InterfaceType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: InterfaceType -> InterfaceType -> Ordering # (<) :: InterfaceType -> InterfaceType -> Bool # (<=) :: InterfaceType -> InterfaceType -> Bool # (>) :: InterfaceType -> InterfaceType -> Bool # (>=) :: InterfaceType -> InterfaceType -> Bool # max :: InterfaceType -> InterfaceType -> InterfaceType # min :: InterfaceType -> InterfaceType -> InterfaceType # | |
Constructors
| ArrayType | |
Fields | |
Instances
| Read ArrayType Source # | |
| Show ArrayType Source # | |
| Eq ArrayType Source # | |
| Ord ArrayType Source # | |
_ArrayType :: Name Source #
data NonArrayType Source #
Constructors
Instances
| Read NonArrayType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NonArrayType # readList :: ReadS [NonArrayType] # | |
| Show NonArrayType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NonArrayType -> ShowS # show :: NonArrayType -> String # showList :: [NonArrayType] -> ShowS # | |
| Eq NonArrayType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord NonArrayType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NonArrayType -> NonArrayType -> Ordering # (<) :: NonArrayType -> NonArrayType -> Bool # (<=) :: NonArrayType -> NonArrayType -> Bool # (>) :: NonArrayType -> NonArrayType -> Bool # (>=) :: NonArrayType -> NonArrayType -> Bool # max :: NonArrayType -> NonArrayType -> NonArrayType # min :: NonArrayType -> NonArrayType -> NonArrayType # | |
_NonArrayType :: Name Source #
newtype RankSpecifier Source #
Constructors
| RankSpecifier | |
Fields | |
Instances
| Read RankSpecifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS RankSpecifier # readList :: ReadS [RankSpecifier] # | |
| Show RankSpecifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> RankSpecifier -> ShowS # show :: RankSpecifier -> String # showList :: [RankSpecifier] -> ShowS # | |
| Eq RankSpecifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: RankSpecifier -> RankSpecifier -> Bool # (/=) :: RankSpecifier -> RankSpecifier -> Bool # | |
| Ord RankSpecifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: RankSpecifier -> RankSpecifier -> Ordering # (<) :: RankSpecifier -> RankSpecifier -> Bool # (<=) :: RankSpecifier -> RankSpecifier -> Bool # (>) :: RankSpecifier -> RankSpecifier -> Bool # (>=) :: RankSpecifier -> RankSpecifier -> Bool # max :: RankSpecifier -> RankSpecifier -> RankSpecifier # min :: RankSpecifier -> RankSpecifier -> RankSpecifier # | |
newtype DelegateType Source #
Constructors
| DelegateType | |
Fields | |
Instances
| Read DelegateType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS DelegateType # readList :: ReadS [DelegateType] # | |
| Show DelegateType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> DelegateType -> ShowS # show :: DelegateType -> String # showList :: [DelegateType] -> ShowS # | |
| Eq DelegateType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord DelegateType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: DelegateType -> DelegateType -> Ordering # (<) :: DelegateType -> DelegateType -> Bool # (<=) :: DelegateType -> DelegateType -> Bool # (>) :: DelegateType -> DelegateType -> Bool # (>=) :: DelegateType -> DelegateType -> Bool # max :: DelegateType -> DelegateType -> DelegateType # min :: DelegateType -> DelegateType -> DelegateType # | |
_DelegateType :: Name Source #
Instances
| Read ValueType Source # | |
| Show ValueType Source # | |
| Eq ValueType Source # | |
| Ord ValueType Source # | |
_ValueType :: Name Source #
data StructOrEnumType Source #
Constructors
| StructOrEnumTypeStruct StructType | |
| StructOrEnumTypeEnum EnumType |
Instances
data StructType Source #
Instances
| Read StructType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS StructType # readList :: ReadS [StructType] # readPrec :: ReadPrec StructType # readListPrec :: ReadPrec [StructType] # | |
| Show StructType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> StructType -> ShowS # show :: StructType -> String # showList :: [StructType] -> ShowS # | |
| Eq StructType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord StructType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: StructType -> StructType -> Ordering # (<) :: StructType -> StructType -> Bool # (<=) :: StructType -> StructType -> Bool # (>) :: StructType -> StructType -> Bool # (>=) :: StructType -> StructType -> Bool # max :: StructType -> StructType -> StructType # min :: StructType -> StructType -> StructType # | |
_StructType :: Name Source #
data SimpleType Source #
Constructors
| SimpleTypeNumeric NumericType | |
| SimpleTypeBool |
Instances
| Read SimpleType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS SimpleType # readList :: ReadS [SimpleType] # readPrec :: ReadPrec SimpleType # readListPrec :: ReadPrec [SimpleType] # | |
| Show SimpleType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> SimpleType -> ShowS # show :: SimpleType -> String # showList :: [SimpleType] -> ShowS # | |
| Eq SimpleType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord SimpleType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: SimpleType -> SimpleType -> Ordering # (<) :: SimpleType -> SimpleType -> Bool # (<=) :: SimpleType -> SimpleType -> Bool # (>) :: SimpleType -> SimpleType -> Bool # (>=) :: SimpleType -> SimpleType -> Bool # max :: SimpleType -> SimpleType -> SimpleType # min :: SimpleType -> SimpleType -> SimpleType # | |
_SimpleType :: Name Source #
data NumericType Source #
Constructors
| NumericTypeIntegral IntegralType | |
| NumericTypeFloatingPoint FloatingPointType | |
| NumericTypeDecimal |
Instances
| Read NumericType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NumericType # readList :: ReadS [NumericType] # readPrec :: ReadPrec NumericType # readListPrec :: ReadPrec [NumericType] # | |
| Show NumericType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NumericType -> ShowS # show :: NumericType -> String # showList :: [NumericType] -> ShowS # | |
| Eq NumericType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord NumericType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NumericType -> NumericType -> Ordering # (<) :: NumericType -> NumericType -> Bool # (<=) :: NumericType -> NumericType -> Bool # (>) :: NumericType -> NumericType -> Bool # (>=) :: NumericType -> NumericType -> Bool # max :: NumericType -> NumericType -> NumericType # min :: NumericType -> NumericType -> NumericType # | |
_NumericType :: Name Source #
data IntegralType Source #
Constructors
| IntegralTypeSbyte | |
| IntegralTypeByte | |
| IntegralTypeShort | |
| IntegralTypeUshort | |
| IntegralTypeInt | |
| IntegralTypeUint | |
| IntegralTypeLong | |
| IntegralTypeUlong | |
| IntegralTypeChar |
Instances
| Read IntegralType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS IntegralType # readList :: ReadS [IntegralType] # | |
| Show IntegralType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> IntegralType -> ShowS # show :: IntegralType -> String # showList :: [IntegralType] -> ShowS # | |
| Eq IntegralType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord IntegralType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: IntegralType -> IntegralType -> Ordering # (<) :: IntegralType -> IntegralType -> Bool # (<=) :: IntegralType -> IntegralType -> Bool # (>) :: IntegralType -> IntegralType -> Bool # (>=) :: IntegralType -> IntegralType -> Bool # max :: IntegralType -> IntegralType -> IntegralType # min :: IntegralType -> IntegralType -> IntegralType # | |
_IntegralType :: Name Source #
data FloatingPointType Source #
Constructors
| FloatingPointTypeFloat | |
| FloatingPointTypeDouble |
Instances
Constructors
| TupleType | |
Fields | |
Instances
| Read TupleType Source # | |
| Show TupleType Source # | |
| Eq TupleType Source # | |
| Ord TupleType Source # | |
_TupleType :: Name Source #
data TupleTypeElement Source #
Constructors
| TupleTypeElement | |
Instances
Constructors
| EnumType | |
Fields | |
newtype TypeArgumentList Source #
Constructors
| TypeArgumentList | |
Fields
| |
Instances
newtype TypeParameter Source #
Constructors
| TypeParameter | |
Fields | |
Instances
| Read TypeParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS TypeParameter # readList :: ReadS [TypeParameter] # | |
| Show TypeParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> TypeParameter -> ShowS # show :: TypeParameter -> String # showList :: [TypeParameter] -> ShowS # | |
| Eq TypeParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: TypeParameter -> TypeParameter -> Bool # (/=) :: TypeParameter -> TypeParameter -> Bool # | |
| Ord TypeParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: TypeParameter -> TypeParameter -> Ordering # (<) :: TypeParameter -> TypeParameter -> Bool # (<=) :: TypeParameter -> TypeParameter -> Bool # (>) :: TypeParameter -> TypeParameter -> Bool # (>=) :: TypeParameter -> TypeParameter -> Bool # max :: TypeParameter -> TypeParameter -> TypeParameter # min :: TypeParameter -> TypeParameter -> TypeParameter # | |
data UnmanagedType Source #
Constructors
| UnmanagedTypeValue ValueType | |
| UnmanagedTypePointer PointerType |
Instances
| Read UnmanagedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS UnmanagedType # readList :: ReadS [UnmanagedType] # | |
| Show UnmanagedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> UnmanagedType -> ShowS # show :: UnmanagedType -> String # showList :: [UnmanagedType] -> ShowS # | |
| Eq UnmanagedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: UnmanagedType -> UnmanagedType -> Bool # (/=) :: UnmanagedType -> UnmanagedType -> Bool # | |
| Ord UnmanagedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: UnmanagedType -> UnmanagedType -> Ordering # (<) :: UnmanagedType -> UnmanagedType -> Bool # (<=) :: UnmanagedType -> UnmanagedType -> Bool # (>) :: UnmanagedType -> UnmanagedType -> Bool # (>=) :: UnmanagedType -> UnmanagedType -> Bool # max :: UnmanagedType -> UnmanagedType -> UnmanagedType # min :: UnmanagedType -> UnmanagedType -> UnmanagedType # | |
newtype VariableReference Source #
Constructors
| VariableReference | |
Fields | |
Instances
_Pattern_var :: Name Source #
data DeclarationPattern Source #
Constructors
| DeclarationPattern | |
Instances
newtype Designation Source #
Constructors
| Designation | |
Fields | |
Instances
| Read Designation Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS Designation # readList :: ReadS [Designation] # readPrec :: ReadPrec Designation # readListPrec :: ReadPrec [Designation] # | |
| Show Designation Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> Designation -> ShowS # show :: Designation -> String # showList :: [Designation] -> ShowS # | |
| Eq Designation Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord Designation Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: Designation -> Designation -> Ordering # (<) :: Designation -> Designation -> Bool # (<=) :: Designation -> Designation -> Bool # (>) :: Designation -> Designation -> Bool # (>=) :: Designation -> Designation -> Bool # max :: Designation -> Designation -> Designation # min :: Designation -> Designation -> Designation # | |
_Designation :: Name Source #
newtype ArgumentList Source #
Constructors
| ArgumentList | |
Fields
| |
Instances
| Read ArgumentList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ArgumentList # readList :: ReadS [ArgumentList] # | |
| Show ArgumentList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ArgumentList -> ShowS # show :: ArgumentList -> String # showList :: [ArgumentList] -> ShowS # | |
| Eq ArgumentList Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord ArgumentList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ArgumentList -> ArgumentList -> Ordering # (<) :: ArgumentList -> ArgumentList -> Bool # (<=) :: ArgumentList -> ArgumentList -> Bool # (>) :: ArgumentList -> ArgumentList -> Bool # (>=) :: ArgumentList -> ArgumentList -> Bool # max :: ArgumentList -> ArgumentList -> ArgumentList # min :: ArgumentList -> ArgumentList -> ArgumentList # | |
_ArgumentList :: Name Source #
Constructors
| Argument | |
Fields | |
data ArgumentValue Source #
Constructors
| ArgumentValueExpression Expression | |
| ArgumentValueIn VariableReference | |
| ArgumentValueRef VariableReference | |
| ArgumentValueOut VariableReference |
Instances
| Read ArgumentValue Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ArgumentValue # readList :: ReadS [ArgumentValue] # | |
| Show ArgumentValue Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ArgumentValue -> ShowS # show :: ArgumentValue -> String # showList :: [ArgumentValue] -> ShowS # | |
| Eq ArgumentValue Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ArgumentValue -> ArgumentValue -> Bool # (/=) :: ArgumentValue -> ArgumentValue -> Bool # | |
| Ord ArgumentValue Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ArgumentValue -> ArgumentValue -> Ordering # (<) :: ArgumentValue -> ArgumentValue -> Bool # (<=) :: ArgumentValue -> ArgumentValue -> Bool # (>) :: ArgumentValue -> ArgumentValue -> Bool # (>=) :: ArgumentValue -> ArgumentValue -> Bool # max :: ArgumentValue -> ArgumentValue -> ArgumentValue # min :: ArgumentValue -> ArgumentValue -> ArgumentValue # | |
data PrimaryExpression Source #
Constructors
| PrimaryExpressionNoArray PrimaryNoArrayCreationExpression | |
| PrimaryExpressionArray ArrayCreationExpression |
Instances
data PrimaryNoArrayCreationExpression Source #
Constructors
Instances
data InterpolatedStringExpression Source #
Constructors
| InterpolatedStringExpressionRegular InterpolatedRegularStringExpression | |
| InterpolatedStringExpressionVerbatim InterpolatedVerbatimStringExpression |
Instances
newtype InterpolatedRegularStringExpression Source #
Constructors
| InterpolatedRegularStringExpression | |
Instances
data RegularInterpolation Source #
Constructors
| RegularInterpolation | |
Instances
newtype InterpolatedVerbatimStringExpression Source #
Constructors
| InterpolatedVerbatimStringExpression | |
Instances
data VerbatimInterpolation Source #
Constructors
| VerbatimInterpolation | |
Instances
data SimpleName Source #
Constructors
| SimpleName | |
Instances
| Read SimpleName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS SimpleName # readList :: ReadS [SimpleName] # readPrec :: ReadPrec SimpleName # readListPrec :: ReadPrec [SimpleName] # | |
| Show SimpleName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> SimpleName -> ShowS # show :: SimpleName -> String # showList :: [SimpleName] -> ShowS # | |
| Eq SimpleName Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord SimpleName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: SimpleName -> SimpleName -> Ordering # (<) :: SimpleName -> SimpleName -> Bool # (<=) :: SimpleName -> SimpleName -> Bool # (>) :: SimpleName -> SimpleName -> Bool # (>=) :: SimpleName -> SimpleName -> Bool # max :: SimpleName -> SimpleName -> SimpleName # min :: SimpleName -> SimpleName -> SimpleName # | |
_SimpleName :: Name Source #
data TupleExpression Source #
Constructors
| TupleExpressionElements [TupleElement] | |
| TupleExpressionDeconstruction DeconstructionTuple |
Instances
| Read TupleExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS TupleExpression # readList :: ReadS [TupleExpression] # | |
| Show TupleExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> TupleExpression -> ShowS # show :: TupleExpression -> String # showList :: [TupleExpression] -> ShowS # | |
| Eq TupleExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: TupleExpression -> TupleExpression -> Bool # (/=) :: TupleExpression -> TupleExpression -> Bool # | |
| Ord TupleExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: TupleExpression -> TupleExpression -> Ordering # (<) :: TupleExpression -> TupleExpression -> Bool # (<=) :: TupleExpression -> TupleExpression -> Bool # (>) :: TupleExpression -> TupleExpression -> Bool # (>=) :: TupleExpression -> TupleExpression -> Bool # max :: TupleExpression -> TupleExpression -> TupleExpression # min :: TupleExpression -> TupleExpression -> TupleExpression # | |
data TupleElement Source #
Constructors
| TupleElement | |
Fields | |
Instances
| Read TupleElement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS TupleElement # readList :: ReadS [TupleElement] # | |
| Show TupleElement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> TupleElement -> ShowS # show :: TupleElement -> String # showList :: [TupleElement] -> ShowS # | |
| Eq TupleElement Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord TupleElement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: TupleElement -> TupleElement -> Ordering # (<) :: TupleElement -> TupleElement -> Bool # (<=) :: TupleElement -> TupleElement -> Bool # (>) :: TupleElement -> TupleElement -> Bool # (>=) :: TupleElement -> TupleElement -> Bool # max :: TupleElement -> TupleElement -> TupleElement # min :: TupleElement -> TupleElement -> TupleElement # | |
_TupleElement :: Name Source #
newtype DeconstructionTuple Source #
Constructors
| DeconstructionTuple | |
Fields | |
Instances
data DeconstructionElement Source #
Constructors
| DeconstructionElementTuple DeconstructionTuple | |
| DeconstructionElementIdentifier Identifier |
Instances
data MemberAccess Source #
Constructors
| MemberAccess | |
Instances
| Read MemberAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS MemberAccess # readList :: ReadS [MemberAccess] # | |
| Show MemberAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> MemberAccess -> ShowS # show :: MemberAccess -> String # showList :: [MemberAccess] -> ShowS # | |
| Eq MemberAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord MemberAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: MemberAccess -> MemberAccess -> Ordering # (<) :: MemberAccess -> MemberAccess -> Bool # (<=) :: MemberAccess -> MemberAccess -> Bool # (>) :: MemberAccess -> MemberAccess -> Bool # (>=) :: MemberAccess -> MemberAccess -> Bool # max :: MemberAccess -> MemberAccess -> MemberAccess # min :: MemberAccess -> MemberAccess -> MemberAccess # | |
_MemberAccess :: Name Source #
data MemberAccessHead Source #
Constructors
| MemberAccessHeadPrimary PrimaryExpression | |
| MemberAccessHeadPredefined PredefinedType | |
| MemberAccessHeadQualifiedAlias QualifiedAliasMember |
Instances
data PredefinedType Source #
Constructors
Instances
| Read PredefinedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS PredefinedType # readList :: ReadS [PredefinedType] # | |
| Show PredefinedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> PredefinedType -> ShowS # show :: PredefinedType -> String # showList :: [PredefinedType] -> ShowS # | |
| Eq PredefinedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: PredefinedType -> PredefinedType -> Bool # (/=) :: PredefinedType -> PredefinedType -> Bool # | |
| Ord PredefinedType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: PredefinedType -> PredefinedType -> Ordering # (<) :: PredefinedType -> PredefinedType -> Bool # (<=) :: PredefinedType -> PredefinedType -> Bool # (>) :: PredefinedType -> PredefinedType -> Bool # (>=) :: PredefinedType -> PredefinedType -> Bool # max :: PredefinedType -> PredefinedType -> PredefinedType # min :: PredefinedType -> PredefinedType -> PredefinedType # | |
data NullConditionalMemberAccess Source #
Constructors
| NullConditionalMemberAccess | |
Instances
data DependentAccess Source #
Constructors
| DependentAccessMemberAccess DependentAccessForMember | |
| DependentAccessElementAccess ArgumentList | |
| DependentAccessInvocation (Maybe ArgumentList) |
Instances
| Read DependentAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS DependentAccess # readList :: ReadS [DependentAccess] # | |
| Show DependentAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> DependentAccess -> ShowS # show :: DependentAccess -> String # showList :: [DependentAccess] -> ShowS # | |
| Eq DependentAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: DependentAccess -> DependentAccess -> Bool # (/=) :: DependentAccess -> DependentAccess -> Bool # | |
| Ord DependentAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: DependentAccess -> DependentAccess -> Ordering # (<) :: DependentAccess -> DependentAccess -> Bool # (<=) :: DependentAccess -> DependentAccess -> Bool # (>) :: DependentAccess -> DependentAccess -> Bool # (>=) :: DependentAccess -> DependentAccess -> Bool # max :: DependentAccess -> DependentAccess -> DependentAccess # min :: DependentAccess -> DependentAccess -> DependentAccess # | |
data DependentAccessForMember Source #
Constructors
| DependentAccessForMember | |
Instances
data NullConditionalProjectionInitializer Source #
Constructors
| NullConditionalProjectionInitializer | |
Instances
data InvocationExpression Source #
Constructors
| InvocationExpression | |
Instances
data NullConditionalInvocationExpression Source #
Constructors
| NullConditionalInvocationExpression | |
Instances
data NullConditionalInvocationExpressionHead Source #
Constructors
| NullConditionalInvocationExpressionHeadMember NullConditionalMemberAccess | |
| NullConditionalInvocationExpressionHeadElement NullConditionalElementAccess |
Instances
data ElementAccess Source #
Constructors
| ElementAccess | |
Instances
| Read ElementAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ElementAccess # readList :: ReadS [ElementAccess] # | |
| Show ElementAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ElementAccess -> ShowS # show :: ElementAccess -> String # showList :: [ElementAccess] -> ShowS # | |
| Eq ElementAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ElementAccess -> ElementAccess -> Bool # (/=) :: ElementAccess -> ElementAccess -> Bool # | |
| Ord ElementAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ElementAccess -> ElementAccess -> Ordering # (<) :: ElementAccess -> ElementAccess -> Bool # (<=) :: ElementAccess -> ElementAccess -> Bool # (>) :: ElementAccess -> ElementAccess -> Bool # (>=) :: ElementAccess -> ElementAccess -> Bool # max :: ElementAccess -> ElementAccess -> ElementAccess # min :: ElementAccess -> ElementAccess -> ElementAccess # | |
data NullConditionalElementAccess Source #
Constructors
| NullConditionalElementAccess | |
Instances
data BaseAccess Source #
Instances
| Read BaseAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS BaseAccess # readList :: ReadS [BaseAccess] # readPrec :: ReadPrec BaseAccess # readListPrec :: ReadPrec [BaseAccess] # | |
| Show BaseAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> BaseAccess -> ShowS # show :: BaseAccess -> String # showList :: [BaseAccess] -> ShowS # | |
| Eq BaseAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord BaseAccess Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: BaseAccess -> BaseAccess -> Ordering # (<) :: BaseAccess -> BaseAccess -> Bool # (<=) :: BaseAccess -> BaseAccess -> Bool # (>) :: BaseAccess -> BaseAccess -> Bool # (>=) :: BaseAccess -> BaseAccess -> Bool # max :: BaseAccess -> BaseAccess -> BaseAccess # min :: BaseAccess -> BaseAccess -> BaseAccess # | |
_BaseAccess :: Name Source #
data BaseAccessWithIdentifier Source #
Constructors
| BaseAccessWithIdentifier | |
Instances
data ObjectCreationExpression Source #
Constructors
| ObjectCreationExpression | |
Instances
data ObjectOrCollectionInitializer Source #
Constructors
| ObjectOrCollectionInitializerObject [MemberInitializer] | |
| ObjectOrCollectionInitializerCollection [ElementInitializer] |
Instances
data MemberInitializer Source #
Constructors
| MemberInitializer | |
Instances
data InitializerTarget Source #
Instances
data InitializerValue Source #
Constructors
| InitializerValueExpression Expression | |
| InitializerValueObjectOrCollection ObjectOrCollectionInitializer |
Instances
data ElementInitializer Source #
Instances
newtype ExpressionList Source #
Constructors
| ExpressionList | |
Fields | |
Instances
| Read ExpressionList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ExpressionList # readList :: ReadS [ExpressionList] # | |
| Show ExpressionList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ExpressionList -> ShowS # show :: ExpressionList -> String # showList :: [ExpressionList] -> ShowS # | |
| Eq ExpressionList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ExpressionList -> ExpressionList -> Bool # (/=) :: ExpressionList -> ExpressionList -> Bool # | |
| Ord ExpressionList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ExpressionList -> ExpressionList -> Ordering # (<) :: ExpressionList -> ExpressionList -> Bool # (<=) :: ExpressionList -> ExpressionList -> Bool # (>) :: ExpressionList -> ExpressionList -> Bool # (>=) :: ExpressionList -> ExpressionList -> Bool # max :: ExpressionList -> ExpressionList -> ExpressionList # min :: ExpressionList -> ExpressionList -> ExpressionList # | |
data ArrayCreationExpression Source #
Constructors
Instances
data NonArrayTypeArrayCreationExpression Source #
Constructors
| NonArrayTypeArrayCreationExpression | |
Instances
data ArrayTypeArrayCreationExpression Source #
Constructors
| ArrayTypeArrayCreationExpression | |
Instances
data RankSpecifierArrayCreationExpression Source #
Constructors
| RankSpecifierArrayCreationExpression | |
Instances
data DelegateCreationExpression Source #
Constructors
| DelegateCreationExpression | |
Instances
newtype MemberDeclaratorList Source #
Constructors
| MemberDeclaratorList | |
Fields | |
Instances
data MemberDeclarator Source #
Constructors
Instances
data AssignmentMemberDeclarator Source #
Constructors
| AssignmentMemberDeclarator | |
Instances
data TypeofExpression Source #
Constructors
| TypeofExpressionType Type | |
| TypeofExpressionUnboundTypeName UnboundTypeName | |
| TypeofExpressionVoid |
Instances
newtype UnboundTypeName Source #
Constructors
| UnboundTypeName | |
Fields | |
Instances
| Read UnboundTypeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS UnboundTypeName # readList :: ReadS [UnboundTypeName] # | |
| Show UnboundTypeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> UnboundTypeName -> ShowS # show :: UnboundTypeName -> String # showList :: [UnboundTypeName] -> ShowS # | |
| Eq UnboundTypeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: UnboundTypeName -> UnboundTypeName -> Bool # (/=) :: UnboundTypeName -> UnboundTypeName -> Bool # | |
| Ord UnboundTypeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: UnboundTypeName -> UnboundTypeName -> Ordering # (<) :: UnboundTypeName -> UnboundTypeName -> Bool # (<=) :: UnboundTypeName -> UnboundTypeName -> Bool # (>) :: UnboundTypeName -> UnboundTypeName -> Bool # (>=) :: UnboundTypeName -> UnboundTypeName -> Bool # max :: UnboundTypeName -> UnboundTypeName -> UnboundTypeName # min :: UnboundTypeName -> UnboundTypeName -> UnboundTypeName # | |
data UnboundTypeNamePart Source #
Constructors
| UnboundTypeNamePart | |
Instances
data DefaultValueExpression Source #
Instances
data StackallocExpression Source #
Constructors
| StackallocExpression | |
Instances
data NamedEntity Source #
Constructors
| NamedEntity | |
Fields | |
Instances
| Read NamedEntity Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NamedEntity # readList :: ReadS [NamedEntity] # readPrec :: ReadPrec NamedEntity # readListPrec :: ReadPrec [NamedEntity] # | |
| Show NamedEntity Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NamedEntity -> ShowS # show :: NamedEntity -> String # showList :: [NamedEntity] -> ShowS # | |
| Eq NamedEntity Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord NamedEntity Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NamedEntity -> NamedEntity -> Ordering # (<) :: NamedEntity -> NamedEntity -> Bool # (<=) :: NamedEntity -> NamedEntity -> Bool # (>) :: NamedEntity -> NamedEntity -> Bool # (>=) :: NamedEntity -> NamedEntity -> Bool # max :: NamedEntity -> NamedEntity -> NamedEntity # min :: NamedEntity -> NamedEntity -> NamedEntity # | |
_NamedEntity :: Name Source #
data NamedEntityPart Source #
Constructors
| NamedEntityPart | |
Instances
| Read NamedEntityPart Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NamedEntityPart # readList :: ReadS [NamedEntityPart] # | |
| Show NamedEntityPart Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NamedEntityPart -> ShowS # show :: NamedEntityPart -> String # showList :: [NamedEntityPart] -> ShowS # | |
| Eq NamedEntityPart Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: NamedEntityPart -> NamedEntityPart -> Bool # (/=) :: NamedEntityPart -> NamedEntityPart -> Bool # | |
| Ord NamedEntityPart Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NamedEntityPart -> NamedEntityPart -> Ordering # (<) :: NamedEntityPart -> NamedEntityPart -> Bool # (<=) :: NamedEntityPart -> NamedEntityPart -> Bool # (>) :: NamedEntityPart -> NamedEntityPart -> Bool # (>=) :: NamedEntityPart -> NamedEntityPart -> Bool # max :: NamedEntityPart -> NamedEntityPart -> NamedEntityPart # min :: NamedEntityPart -> NamedEntityPart -> NamedEntityPart # | |
data NamedEntityTarget Source #
Constructors
| NamedEntityTargetName SimpleName | |
| NamedEntityTargetThis | |
| NamedEntityTargetBase | |
| NamedEntityTargetPredefinedType PredefinedType | |
| NamedEntityTargetQualifiedAliasMember QualifiedAliasMember |
Instances
data UnaryExpression Source #
Constructors
Instances
| Read UnaryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS UnaryExpression # readList :: ReadS [UnaryExpression] # | |
| Show UnaryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> UnaryExpression -> ShowS # show :: UnaryExpression -> String # showList :: [UnaryExpression] -> ShowS # | |
| Eq UnaryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: UnaryExpression -> UnaryExpression -> Bool # (/=) :: UnaryExpression -> UnaryExpression -> Bool # | |
| Ord UnaryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: UnaryExpression -> UnaryExpression -> Ordering # (<) :: UnaryExpression -> UnaryExpression -> Bool # (<=) :: UnaryExpression -> UnaryExpression -> Bool # (>) :: UnaryExpression -> UnaryExpression -> Bool # (>=) :: UnaryExpression -> UnaryExpression -> Bool # max :: UnaryExpression -> UnaryExpression -> UnaryExpression # min :: UnaryExpression -> UnaryExpression -> UnaryExpression # | |
data CastExpression Source #
Constructors
| CastExpression | |
Instances
| Read CastExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS CastExpression # readList :: ReadS [CastExpression] # | |
| Show CastExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> CastExpression -> ShowS # show :: CastExpression -> String # showList :: [CastExpression] -> ShowS # | |
| Eq CastExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: CastExpression -> CastExpression -> Bool # (/=) :: CastExpression -> CastExpression -> Bool # | |
| Ord CastExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: CastExpression -> CastExpression -> Ordering # (<) :: CastExpression -> CastExpression -> Bool # (<=) :: CastExpression -> CastExpression -> Bool # (>) :: CastExpression -> CastExpression -> Bool # (>=) :: CastExpression -> CastExpression -> Bool # max :: CastExpression -> CastExpression -> CastExpression # min :: CastExpression -> CastExpression -> CastExpression # | |
data MultiplicativeExpression Source #
Constructors
| MultiplicativeExpressionSimple UnaryExpression | |
| MultiplicativeExpressionBinary BinaryMultiplicativeExpression |
Instances
data BinaryMultiplicativeExpression Source #
Constructors
| BinaryMultiplicativeExpression | |
Instances
data MultiplicativeOperator Source #
Instances
data AdditiveExpression Source #
Constructors
| AdditiveExpressionSimple MultiplicativeExpression | |
| AdditiveExpressionBinary BinaryAdditiveExpression |
Instances
data BinaryAdditiveExpression Source #
Constructors
| BinaryAdditiveExpression | |
Instances
data AdditiveOperator Source #
Constructors
| AdditiveOperatorPlus | |
| AdditiveOperatorMinus |
Instances
data ShiftExpression Source #
Instances
| Read ShiftExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ShiftExpression # readList :: ReadS [ShiftExpression] # | |
| Show ShiftExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ShiftExpression -> ShowS # show :: ShiftExpression -> String # showList :: [ShiftExpression] -> ShowS # | |
| Eq ShiftExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ShiftExpression -> ShiftExpression -> Bool # (/=) :: ShiftExpression -> ShiftExpression -> Bool # | |
| Ord ShiftExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ShiftExpression -> ShiftExpression -> Ordering # (<) :: ShiftExpression -> ShiftExpression -> Bool # (<=) :: ShiftExpression -> ShiftExpression -> Bool # (>) :: ShiftExpression -> ShiftExpression -> Bool # (>=) :: ShiftExpression -> ShiftExpression -> Bool # max :: ShiftExpression -> ShiftExpression -> ShiftExpression # min :: ShiftExpression -> ShiftExpression -> ShiftExpression # | |
data BinaryShiftExpression Source #
Constructors
| BinaryShiftExpression | |
Instances
data ShiftOperator Source #
Constructors
| ShiftOperatorLeft | |
| ShiftOperatorRight |
Instances
| Read ShiftOperator Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ShiftOperator # readList :: ReadS [ShiftOperator] # | |
| Show ShiftOperator Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ShiftOperator -> ShowS # show :: ShiftOperator -> String # showList :: [ShiftOperator] -> ShowS # | |
| Eq ShiftOperator Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ShiftOperator -> ShiftOperator -> Bool # (/=) :: ShiftOperator -> ShiftOperator -> Bool # | |
| Ord ShiftOperator Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ShiftOperator -> ShiftOperator -> Ordering # (<) :: ShiftOperator -> ShiftOperator -> Bool # (<=) :: ShiftOperator -> ShiftOperator -> Bool # (>) :: ShiftOperator -> ShiftOperator -> Bool # (>=) :: ShiftOperator -> ShiftOperator -> Bool # max :: ShiftOperator -> ShiftOperator -> ShiftOperator # min :: ShiftOperator -> ShiftOperator -> ShiftOperator # | |
data RelationalExpression Source #
Constructors
Instances
data BinaryRelationalExpression Source #
Constructors
| BinaryRelationalExpression | |
Instances
data RelationalOperator Source #
Constructors
| RelationalOperatorLessThan | |
| RelationalOperatorGreaterThan | |
| RelationalOperatorLessThanOrEqual | |
| RelationalOperatorGreaterThanOrEqual |
Instances
data IsTypeExpression Source #
Constructors
| IsTypeExpression | |
Instances
data IsPatternExpression Source #
Constructors
| IsPatternExpression | |
Instances
data AsTypeExpression Source #
Constructors
| AsTypeExpression | |
Instances
data EqualityExpression Source #
Constructors
| EqualityExpressionSimple RelationalExpression | |
| EqualityExpressionBinary BinaryEqualityExpression |
Instances
data BinaryEqualityExpression Source #
Constructors
| BinaryEqualityExpression | |
Instances
data EqualityOperator Source #
Constructors
| EqualityOperatorEqual | |
| EqualityOperatorNotEqual |
Instances
data AndExpression Source #
Instances
| Read AndExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS AndExpression # readList :: ReadS [AndExpression] # | |
| Show AndExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> AndExpression -> ShowS # show :: AndExpression -> String # showList :: [AndExpression] -> ShowS # | |
| Eq AndExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: AndExpression -> AndExpression -> Bool # (/=) :: AndExpression -> AndExpression -> Bool # | |
| Ord AndExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: AndExpression -> AndExpression -> Ordering # (<) :: AndExpression -> AndExpression -> Bool # (<=) :: AndExpression -> AndExpression -> Bool # (>) :: AndExpression -> AndExpression -> Bool # (>=) :: AndExpression -> AndExpression -> Bool # max :: AndExpression -> AndExpression -> AndExpression # min :: AndExpression -> AndExpression -> AndExpression # | |
data BinaryAndExpression Source #
Constructors
| BinaryAndExpression | |
Instances
data ExclusiveOrExpression Source #
Constructors
| ExclusiveOrExpressionSimple AndExpression | |
| ExclusiveOrExpressionBinary BinaryExclusiveOrExpression |
Instances
data BinaryExclusiveOrExpression Source #
Constructors
| BinaryExclusiveOrExpression | |
Instances
data InclusiveOrExpression Source #
Constructors
| InclusiveOrExpressionSimple ExclusiveOrExpression | |
| InclusiveOrExpressionBinary BinaryInclusiveOrExpression |
Instances
data BinaryInclusiveOrExpression Source #
Constructors
| BinaryInclusiveOrExpression | |
Instances
data ConditionalAndExpression Source #
Constructors
| ConditionalAndExpressionSimple InclusiveOrExpression | |
| ConditionalAndExpressionBinary BinaryConditionalAndExpression |
Instances
data BinaryConditionalAndExpression Source #
Constructors
| BinaryConditionalAndExpression | |
Instances
data ConditionalOrExpression Source #
Constructors
| ConditionalOrExpressionSimple ConditionalAndExpression | |
| ConditionalOrExpressionBinary BinaryConditionalOrExpression |
Instances
data BinaryConditionalOrExpression Source #
Constructors
| BinaryConditionalOrExpression | |
Instances
data NullCoalescingExpression Source #
Constructors
| NullCoalescingExpressionSimple ConditionalOrExpression | |
| NullCoalescingExpressionBinary BinaryNullCoalescingExpression | |
| NullCoalescingExpressionThrow NullCoalescingExpression |
Instances
data BinaryNullCoalescingExpression Source #
Constructors
| BinaryNullCoalescingExpression | |
Instances
data DeclarationExpression Source #
Constructors
| DeclarationExpression | |
Instances
data LocalVariableType Source #
Constructors
| LocalVariableTypeType Type | |
| LocalVariableTypeVar |
Instances
data ConditionalExpression Source #
Constructors
| ConditionalExpressionSimple NullCoalescingExpression | |
| ConditionalExpressionSimpleConditional SimpleConditionalExpression | |
| ConditionalExpressionRefConditional RefConditionalExpression |
Instances
data SimpleConditionalExpression Source #
Constructors
| SimpleConditionalExpression | |
Instances
data RefConditionalExpression Source #
Constructors
| RefConditionalExpression | |
Instances
data LambdaExpression Source #
Constructors
| LambdaExpression | |
Instances
data AnonymousMethodExpression Source #
Constructors
| AnonymousMethodExpression | |
Instances
data AnonymousFunctionSignature Source #
Constructors
| AnonymousFunctionSignatureExplicit [ExplicitAnonymousFunctionParameter] | |
| AnonymousFunctionSignatureImplicit [Identifier] |
Instances
data ExplicitAnonymousFunctionParameter Source #
Constructors
| ExplicitAnonymousFunctionParameter | |
Instances
data AnonymousFunctionParameterModifier Source #
Constructors
| AnonymousFunctionParameterModifierRef | |
| AnonymousFunctionParameterModifierOut | |
| AnonymousFunctionParameterModifierIn |
Instances
data AnonymousFunctionBody Source #
Constructors
Instances
data QueryExpression Source #
Constructors
| QueryExpression | |
Fields | |
Instances
| Read QueryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS QueryExpression # readList :: ReadS [QueryExpression] # | |
| Show QueryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> QueryExpression -> ShowS # show :: QueryExpression -> String # showList :: [QueryExpression] -> ShowS # | |
| Eq QueryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: QueryExpression -> QueryExpression -> Bool # (/=) :: QueryExpression -> QueryExpression -> Bool # | |
| Ord QueryExpression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: QueryExpression -> QueryExpression -> Ordering # (<) :: QueryExpression -> QueryExpression -> Bool # (<=) :: QueryExpression -> QueryExpression -> Bool # (>) :: QueryExpression -> QueryExpression -> Bool # (>=) :: QueryExpression -> QueryExpression -> Bool # max :: QueryExpression -> QueryExpression -> QueryExpression # min :: QueryExpression -> QueryExpression -> QueryExpression # | |
data FromClause Source #
Constructors
| FromClause | |
Fields | |
Instances
| Read FromClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS FromClause # readList :: ReadS [FromClause] # readPrec :: ReadPrec FromClause # readListPrec :: ReadPrec [FromClause] # | |
| Show FromClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> FromClause -> ShowS # show :: FromClause -> String # showList :: [FromClause] -> ShowS # | |
| Eq FromClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord FromClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: FromClause -> FromClause -> Ordering # (<) :: FromClause -> FromClause -> Bool # (<=) :: FromClause -> FromClause -> Bool # (>) :: FromClause -> FromClause -> Bool # (>=) :: FromClause -> FromClause -> Bool # max :: FromClause -> FromClause -> FromClause # min :: FromClause -> FromClause -> FromClause # | |
_FromClause :: Name Source #
Constructors
| QueryBody | |
Instances
| Read QueryBody Source # | |
| Show QueryBody Source # | |
| Eq QueryBody Source # | |
| Ord QueryBody Source # | |
_QueryBody :: Name Source #
data QueryBodyClause Source #
Constructors
| QueryBodyClauseFrom FromClause | |
| QueryBodyClauseLet LetClause | |
| QueryBodyClauseWhere BooleanExpression | |
| QueryBodyClauseJoin JoinClause | |
| QueryBodyClauseOrderby [Ordering_] |
Instances
| Read QueryBodyClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS QueryBodyClause # readList :: ReadS [QueryBodyClause] # | |
| Show QueryBodyClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> QueryBodyClause -> ShowS # show :: QueryBodyClause -> String # showList :: [QueryBodyClause] -> ShowS # | |
| Eq QueryBodyClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: QueryBodyClause -> QueryBodyClause -> Bool # (/=) :: QueryBodyClause -> QueryBodyClause -> Bool # | |
| Ord QueryBodyClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: QueryBodyClause -> QueryBodyClause -> Ordering # (<) :: QueryBodyClause -> QueryBodyClause -> Bool # (<=) :: QueryBodyClause -> QueryBodyClause -> Bool # (>) :: QueryBodyClause -> QueryBodyClause -> Bool # (>=) :: QueryBodyClause -> QueryBodyClause -> Bool # max :: QueryBodyClause -> QueryBodyClause -> QueryBodyClause # min :: QueryBodyClause -> QueryBodyClause -> QueryBodyClause # | |
Constructors
| LetClause | |
Fields | |
Instances
| Read LetClause Source # | |
| Show LetClause Source # | |
| Eq LetClause Source # | |
| Ord LetClause Source # | |
_LetClause :: Name Source #
data JoinClause Source #
Constructors
| JoinClause | |
Instances
| Read JoinClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS JoinClause # readList :: ReadS [JoinClause] # readPrec :: ReadPrec JoinClause # readListPrec :: ReadPrec [JoinClause] # | |
| Show JoinClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> JoinClause -> ShowS # show :: JoinClause -> String # showList :: [JoinClause] -> ShowS # | |
| Eq JoinClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord JoinClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: JoinClause -> JoinClause -> Ordering # (<) :: JoinClause -> JoinClause -> Bool # (<=) :: JoinClause -> JoinClause -> Bool # (>) :: JoinClause -> JoinClause -> Bool # (>=) :: JoinClause -> JoinClause -> Bool # max :: JoinClause -> JoinClause -> JoinClause # min :: JoinClause -> JoinClause -> JoinClause # | |
_JoinClause :: Name Source #
Constructors
| Ordering_ | |
Instances
| Read Ordering_ Source # | |
| Show Ordering_ Source # | |
| Eq Ordering_ Source # | |
| Ord Ordering_ Source # | |
data OrderingDirection Source #
Instances
data SelectOrGroupClause Source #
Instances
data GroupClause Source #
Constructors
| GroupClause | |
Fields | |
Instances
| Read GroupClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS GroupClause # readList :: ReadS [GroupClause] # readPrec :: ReadPrec GroupClause # readListPrec :: ReadPrec [GroupClause] # | |
| Show GroupClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> GroupClause -> ShowS # show :: GroupClause -> String # showList :: [GroupClause] -> ShowS # | |
| Eq GroupClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord GroupClause Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: GroupClause -> GroupClause -> Ordering # (<) :: GroupClause -> GroupClause -> Bool # (<=) :: GroupClause -> GroupClause -> Bool # (>) :: GroupClause -> GroupClause -> Bool # (>=) :: GroupClause -> GroupClause -> Bool # max :: GroupClause -> GroupClause -> GroupClause # min :: GroupClause -> GroupClause -> GroupClause # | |
_GroupClause :: Name Source #
data QueryContinuation Source #
Constructors
| QueryContinuation | |
Instances
data Assignment Source #
Constructors
| Assignment | |
Instances
| Read Assignment Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS Assignment # readList :: ReadS [Assignment] # readPrec :: ReadPrec Assignment # readListPrec :: ReadPrec [Assignment] # | |
| Show Assignment Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> Assignment -> ShowS # show :: Assignment -> String # showList :: [Assignment] -> ShowS # | |
| Eq Assignment Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord Assignment Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: Assignment -> Assignment -> Ordering # (<) :: Assignment -> Assignment -> Bool # (<=) :: Assignment -> Assignment -> Bool # (>) :: Assignment -> Assignment -> Bool # (>=) :: Assignment -> Assignment -> Bool # max :: Assignment -> Assignment -> Assignment # min :: Assignment -> Assignment -> Assignment # | |
_Assignment :: Name Source #
data AssignmentOperator Source #
Constructors
Instances
data Expression Source #
Instances
| Read Expression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS Expression # readList :: ReadS [Expression] # readPrec :: ReadPrec Expression # readListPrec :: ReadPrec [Expression] # | |
| Show Expression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> Expression -> ShowS # show :: Expression -> String # showList :: [Expression] -> ShowS # | |
| Eq Expression Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord Expression Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: Expression -> Expression -> Ordering # (<) :: Expression -> Expression -> Bool # (<=) :: Expression -> Expression -> Bool # (>) :: Expression -> Expression -> Bool # (>=) :: Expression -> Expression -> Bool # max :: Expression -> Expression -> Expression # min :: Expression -> Expression -> Expression # | |
_Expression :: Name Source #
data NonAssignmentExpression Source #
Constructors
Instances
newtype ConstantExpression Source #
Constructors
| ConstantExpression | |
Fields | |
Instances
newtype BooleanExpression Source #
Constructors
| BooleanExpression | |
Fields | |
Instances
Constructors
| StatementLabeled LabeledStatement | |
| StatementDeclaration DeclarationStatement | |
| StatementEmbedded EmbeddedStatement |
Instances
| Read Statement Source # | |
| Show Statement Source # | |
| Eq Statement Source # | |
| Ord Statement Source # | |
_Statement :: Name Source #
data EmbeddedStatement Source #
Constructors
Instances
data LabeledStatement Source #
Constructors
| LabeledStatement | |
Instances
data DeclarationStatement Source #
Constructors
| DeclarationStatementVariable LocalVariableDeclaration | |
| DeclarationStatementConstant LocalConstantDeclaration | |
| DeclarationStatementFunction LocalFunctionDeclaration |
Instances
data LocalVariableDeclaration Source #
Constructors
Instances
data ImplicitlyTypedLocalVariableDeclaration Source #
Constructors
| ImplicitlyTypedLocalVariableDeclarationVar ImplicitlyTypedLocalVariableDeclarator | |
| ImplicitlyTypedLocalVariableDeclarationRefVar RefVarImplicitlyTypedLocalVariableDeclaration |
Instances
data RefVarImplicitlyTypedLocalVariableDeclaration Source #
Constructors
| RefVarImplicitlyTypedLocalVariableDeclaration | |
Instances
data ImplicitlyTypedLocalVariableDeclarator Source #
Constructors
| ImplicitlyTypedLocalVariableDeclarator | |
Instances
data ExplicitlyTypedLocalVariableDeclaration Source #
Constructors
| ExplicitlyTypedLocalVariableDeclaration | |
Instances
data ExplicitlyTypedLocalVariableDeclarator Source #
Constructors
| ExplicitlyTypedLocalVariableDeclarator | |
Instances
data LocalVariableInitializer Source #
Constructors
| LocalVariableInitializerExpression Expression | |
| LocalVariableInitializerInitializer ArrayInitializer |
Instances
data RefLocalVariableDeclaration Source #
Constructors
| RefLocalVariableDeclaration | |
Instances
data RefLocalVariableDeclarator Source #
Constructors
| RefLocalVariableDeclarator | |
Instances
data LocalConstantDeclaration Source #
Constructors
| LocalConstantDeclaration | |
Instances
data ConstantDeclarator Source #
Constructors
| ConstantDeclarator | |
Instances
data LocalFunctionDeclaration Source #
Constructors
| LocalFunctionDeclarationStandard StandardLocalFunctionDeclaration | |
| LocalFunctionDeclarationRef RefLocalFunctionDeclaration |
Instances
data StandardLocalFunctionDeclaration Source #
Constructors
| StandardLocalFunctionDeclaration | |
Instances
data RefLocalFunctionDeclaration Source #
Constructors
| RefLocalFunctionDeclaration | |
Instances
data LocalFunctionHeader Source #
Constructors
| LocalFunctionHeader | |
Instances
data LocalFunctionModifier Source #
Instances
data RefLocalFunctionModifier Source #
Instances
data LocalFunctionBody Source #
Constructors
| LocalFunctionBodyBlock Block | |
| LocalFunctionBodyNullConditionalInvocation NullConditionalInvocationExpression | |
| LocalFunctionBodyExpression Expression |
Instances
data RefLocalFunctionBody Source #
Instances
data StatementExpression Source #
Constructors
Instances
data SelectionStatement Source #
Instances
data IfStatement Source #
Constructors
| IfStatement | |
Instances
| Read IfStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS IfStatement # readList :: ReadS [IfStatement] # readPrec :: ReadPrec IfStatement # readListPrec :: ReadPrec [IfStatement] # | |
| Show IfStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> IfStatement -> ShowS # show :: IfStatement -> String # showList :: [IfStatement] -> ShowS # | |
| Eq IfStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord IfStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: IfStatement -> IfStatement -> Ordering # (<) :: IfStatement -> IfStatement -> Bool # (<=) :: IfStatement -> IfStatement -> Bool # (>) :: IfStatement -> IfStatement -> Bool # (>=) :: IfStatement -> IfStatement -> Bool # max :: IfStatement -> IfStatement -> IfStatement # min :: IfStatement -> IfStatement -> IfStatement # | |
_IfStatement :: Name Source #
data SwitchStatement Source #
Constructors
| SwitchStatement | |
Instances
| Read SwitchStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS SwitchStatement # readList :: ReadS [SwitchStatement] # | |
| Show SwitchStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> SwitchStatement -> ShowS # show :: SwitchStatement -> String # showList :: [SwitchStatement] -> ShowS # | |
| Eq SwitchStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: SwitchStatement -> SwitchStatement -> Bool # (/=) :: SwitchStatement -> SwitchStatement -> Bool # | |
| Ord SwitchStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: SwitchStatement -> SwitchStatement -> Ordering # (<) :: SwitchStatement -> SwitchStatement -> Bool # (<=) :: SwitchStatement -> SwitchStatement -> Bool # (>) :: SwitchStatement -> SwitchStatement -> Bool # (>=) :: SwitchStatement -> SwitchStatement -> Bool # max :: SwitchStatement -> SwitchStatement -> SwitchStatement # min :: SwitchStatement -> SwitchStatement -> SwitchStatement # | |
data SwitchSection Source #
Constructors
| SwitchSection | |
Fields | |
Instances
| Read SwitchSection Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS SwitchSection # readList :: ReadS [SwitchSection] # | |
| Show SwitchSection Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> SwitchSection -> ShowS # show :: SwitchSection -> String # showList :: [SwitchSection] -> ShowS # | |
| Eq SwitchSection Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: SwitchSection -> SwitchSection -> Bool # (/=) :: SwitchSection -> SwitchSection -> Bool # | |
| Ord SwitchSection Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: SwitchSection -> SwitchSection -> Ordering # (<) :: SwitchSection -> SwitchSection -> Bool # (<=) :: SwitchSection -> SwitchSection -> Bool # (>) :: SwitchSection -> SwitchSection -> Bool # (>=) :: SwitchSection -> SwitchSection -> Bool # max :: SwitchSection -> SwitchSection -> SwitchSection # min :: SwitchSection -> SwitchSection -> SwitchSection # | |
data SwitchLabel Source #
Constructors
| SwitchLabelBranch SwitchBranch | |
| SwitchLabelDefault |
Instances
| Read SwitchLabel Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS SwitchLabel # readList :: ReadS [SwitchLabel] # readPrec :: ReadPrec SwitchLabel # readListPrec :: ReadPrec [SwitchLabel] # | |
| Show SwitchLabel Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> SwitchLabel -> ShowS # show :: SwitchLabel -> String # showList :: [SwitchLabel] -> ShowS # | |
| Eq SwitchLabel Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord SwitchLabel Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: SwitchLabel -> SwitchLabel -> Ordering # (<) :: SwitchLabel -> SwitchLabel -> Bool # (<=) :: SwitchLabel -> SwitchLabel -> Bool # (>) :: SwitchLabel -> SwitchLabel -> Bool # (>=) :: SwitchLabel -> SwitchLabel -> Bool # max :: SwitchLabel -> SwitchLabel -> SwitchLabel # min :: SwitchLabel -> SwitchLabel -> SwitchLabel # | |
_SwitchLabel :: Name Source #
data SwitchBranch Source #
Constructors
| SwitchBranch | |
Fields | |
Instances
| Read SwitchBranch Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS SwitchBranch # readList :: ReadS [SwitchBranch] # | |
| Show SwitchBranch Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> SwitchBranch -> ShowS # show :: SwitchBranch -> String # showList :: [SwitchBranch] -> ShowS # | |
| Eq SwitchBranch Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord SwitchBranch Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: SwitchBranch -> SwitchBranch -> Ordering # (<) :: SwitchBranch -> SwitchBranch -> Bool # (<=) :: SwitchBranch -> SwitchBranch -> Bool # (>) :: SwitchBranch -> SwitchBranch -> Bool # (>=) :: SwitchBranch -> SwitchBranch -> Bool # max :: SwitchBranch -> SwitchBranch -> SwitchBranch # min :: SwitchBranch -> SwitchBranch -> SwitchBranch # | |
_SwitchBranch :: Name Source #
data IterationStatement Source #
Constructors
| IterationStatementWhile WhileStatement | |
| IterationStatementDo DoStatement | |
| IterationStatementFor ForStatement | |
| IterationStatementForeach ForeachStatement |
Instances
data WhileStatement Source #
Constructors
| WhileStatement | |
Instances
| Read WhileStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS WhileStatement # readList :: ReadS [WhileStatement] # | |
| Show WhileStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> WhileStatement -> ShowS # show :: WhileStatement -> String # showList :: [WhileStatement] -> ShowS # | |
| Eq WhileStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: WhileStatement -> WhileStatement -> Bool # (/=) :: WhileStatement -> WhileStatement -> Bool # | |
| Ord WhileStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: WhileStatement -> WhileStatement -> Ordering # (<) :: WhileStatement -> WhileStatement -> Bool # (<=) :: WhileStatement -> WhileStatement -> Bool # (>) :: WhileStatement -> WhileStatement -> Bool # (>=) :: WhileStatement -> WhileStatement -> Bool # max :: WhileStatement -> WhileStatement -> WhileStatement # min :: WhileStatement -> WhileStatement -> WhileStatement # | |
data DoStatement Source #
Constructors
| DoStatement | |
Instances
| Read DoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS DoStatement # readList :: ReadS [DoStatement] # readPrec :: ReadPrec DoStatement # readListPrec :: ReadPrec [DoStatement] # | |
| Show DoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> DoStatement -> ShowS # show :: DoStatement -> String # showList :: [DoStatement] -> ShowS # | |
| Eq DoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord DoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: DoStatement -> DoStatement -> Ordering # (<) :: DoStatement -> DoStatement -> Bool # (<=) :: DoStatement -> DoStatement -> Bool # (>) :: DoStatement -> DoStatement -> Bool # (>=) :: DoStatement -> DoStatement -> Bool # max :: DoStatement -> DoStatement -> DoStatement # min :: DoStatement -> DoStatement -> DoStatement # | |
_DoStatement :: Name Source #
data ForStatement Source #
Constructors
| ForStatement | |
Instances
| Read ForStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ForStatement # readList :: ReadS [ForStatement] # | |
| Show ForStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ForStatement -> ShowS # show :: ForStatement -> String # showList :: [ForStatement] -> ShowS # | |
| Eq ForStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord ForStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ForStatement -> ForStatement -> Ordering # (<) :: ForStatement -> ForStatement -> Bool # (<=) :: ForStatement -> ForStatement -> Bool # (>) :: ForStatement -> ForStatement -> Bool # (>=) :: ForStatement -> ForStatement -> Bool # max :: ForStatement -> ForStatement -> ForStatement # min :: ForStatement -> ForStatement -> ForStatement # | |
_ForStatement :: Name Source #
data ForInitializer Source #
Constructors
| ForInitializerVariable LocalVariableDeclaration | |
| ForInitializerStatements StatementExpressionList |
Instances
| Read ForInitializer Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ForInitializer # readList :: ReadS [ForInitializer] # | |
| Show ForInitializer Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ForInitializer -> ShowS # show :: ForInitializer -> String # showList :: [ForInitializer] -> ShowS # | |
| Eq ForInitializer Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ForInitializer -> ForInitializer -> Bool # (/=) :: ForInitializer -> ForInitializer -> Bool # | |
| Ord ForInitializer Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ForInitializer -> ForInitializer -> Ordering # (<) :: ForInitializer -> ForInitializer -> Bool # (<=) :: ForInitializer -> ForInitializer -> Bool # (>) :: ForInitializer -> ForInitializer -> Bool # (>=) :: ForInitializer -> ForInitializer -> Bool # max :: ForInitializer -> ForInitializer -> ForInitializer # min :: ForInitializer -> ForInitializer -> ForInitializer # | |
newtype StatementExpressionList Source #
Constructors
| StatementExpressionList | |
Fields | |
Instances
data ForeachStatement Source #
Constructors
| ForeachStatement | |
Instances
data JumpStatement Source #
Constructors
| JumpStatementBreak | |
| JumpStatementContinue | |
| JumpStatementGoto GotoStatement | |
| JumpStatementReturn ReturnStatement | |
| JumpStatementThrow (Maybe Expression) |
Instances
| Read JumpStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS JumpStatement # readList :: ReadS [JumpStatement] # | |
| Show JumpStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> JumpStatement -> ShowS # show :: JumpStatement -> String # showList :: [JumpStatement] -> ShowS # | |
| Eq JumpStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: JumpStatement -> JumpStatement -> Bool # (/=) :: JumpStatement -> JumpStatement -> Bool # | |
| Ord JumpStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: JumpStatement -> JumpStatement -> Ordering # (<) :: JumpStatement -> JumpStatement -> Bool # (<=) :: JumpStatement -> JumpStatement -> Bool # (>) :: JumpStatement -> JumpStatement -> Bool # (>=) :: JumpStatement -> JumpStatement -> Bool # max :: JumpStatement -> JumpStatement -> JumpStatement # min :: JumpStatement -> JumpStatement -> JumpStatement # | |
data GotoStatement Source #
Constructors
| GotoStatementIdentifier Identifier | |
| GotoStatementCase ConstantExpression | |
| GotoStatementDefault |
Instances
| Read GotoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS GotoStatement # readList :: ReadS [GotoStatement] # | |
| Show GotoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> GotoStatement -> ShowS # show :: GotoStatement -> String # showList :: [GotoStatement] -> ShowS # | |
| Eq GotoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: GotoStatement -> GotoStatement -> Bool # (/=) :: GotoStatement -> GotoStatement -> Bool # | |
| Ord GotoStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: GotoStatement -> GotoStatement -> Ordering # (<) :: GotoStatement -> GotoStatement -> Bool # (<=) :: GotoStatement -> GotoStatement -> Bool # (>) :: GotoStatement -> GotoStatement -> Bool # (>=) :: GotoStatement -> GotoStatement -> Bool # max :: GotoStatement -> GotoStatement -> GotoStatement # min :: GotoStatement -> GotoStatement -> GotoStatement # | |
data ReturnStatement Source #
Constructors
| ReturnStatementSimple | |
| ReturnStatementValue Expression | |
| ReturnStatementRef VariableReference |
Instances
| Read ReturnStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ReturnStatement # readList :: ReadS [ReturnStatement] # | |
| Show ReturnStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ReturnStatement -> ShowS # show :: ReturnStatement -> String # showList :: [ReturnStatement] -> ShowS # | |
| Eq ReturnStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ReturnStatement -> ReturnStatement -> Bool # (/=) :: ReturnStatement -> ReturnStatement -> Bool # | |
| Ord ReturnStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ReturnStatement -> ReturnStatement -> Ordering # (<) :: ReturnStatement -> ReturnStatement -> Bool # (<=) :: ReturnStatement -> ReturnStatement -> Bool # (>) :: ReturnStatement -> ReturnStatement -> Bool # (>=) :: ReturnStatement -> ReturnStatement -> Bool # max :: ReturnStatement -> ReturnStatement -> ReturnStatement # min :: ReturnStatement -> ReturnStatement -> ReturnStatement # | |
data TryStatement Source #
Constructors
| TryStatement | |
Fields | |
Instances
| Read TryStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS TryStatement # readList :: ReadS [TryStatement] # | |
| Show TryStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> TryStatement -> ShowS # show :: TryStatement -> String # showList :: [TryStatement] -> ShowS # | |
| Eq TryStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord TryStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: TryStatement -> TryStatement -> Ordering # (<) :: TryStatement -> TryStatement -> Bool # (<=) :: TryStatement -> TryStatement -> Bool # (>) :: TryStatement -> TryStatement -> Bool # (>=) :: TryStatement -> TryStatement -> Bool # max :: TryStatement -> TryStatement -> TryStatement # min :: TryStatement -> TryStatement -> TryStatement # | |
_TryStatement :: Name Source #
data CatchClauses Source #
Constructors
| CatchClausesSpecific [SpecificCatchClause] | |
| CatchClausesGeneral Block |
Instances
| Read CatchClauses Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS CatchClauses # readList :: ReadS [CatchClauses] # | |
| Show CatchClauses Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> CatchClauses -> ShowS # show :: CatchClauses -> String # showList :: [CatchClauses] -> ShowS # | |
| Eq CatchClauses Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord CatchClauses Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: CatchClauses -> CatchClauses -> Ordering # (<) :: CatchClauses -> CatchClauses -> Bool # (<=) :: CatchClauses -> CatchClauses -> Bool # (>) :: CatchClauses -> CatchClauses -> Bool # (>=) :: CatchClauses -> CatchClauses -> Bool # max :: CatchClauses -> CatchClauses -> CatchClauses # min :: CatchClauses -> CatchClauses -> CatchClauses # | |
_CatchClauses :: Name Source #
data SpecificCatchClause Source #
Constructors
| SpecificCatchClause | |
Instances
data ExceptionSpecifier Source #
Constructors
| ExceptionSpecifier | |
Instances
data LockStatement Source #
Constructors
| LockStatement | |
Instances
| Read LockStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS LockStatement # readList :: ReadS [LockStatement] # | |
| Show LockStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> LockStatement -> ShowS # show :: LockStatement -> String # showList :: [LockStatement] -> ShowS # | |
| Eq LockStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: LockStatement -> LockStatement -> Bool # (/=) :: LockStatement -> LockStatement -> Bool # | |
| Ord LockStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: LockStatement -> LockStatement -> Ordering # (<) :: LockStatement -> LockStatement -> Bool # (<=) :: LockStatement -> LockStatement -> Bool # (>) :: LockStatement -> LockStatement -> Bool # (>=) :: LockStatement -> LockStatement -> Bool # max :: LockStatement -> LockStatement -> LockStatement # min :: LockStatement -> LockStatement -> LockStatement # | |
data UsingStatement Source #
Constructors
| UsingStatement | |
Instances
| Read UsingStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS UsingStatement # readList :: ReadS [UsingStatement] # | |
| Show UsingStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> UsingStatement -> ShowS # show :: UsingStatement -> String # showList :: [UsingStatement] -> ShowS # | |
| Eq UsingStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: UsingStatement -> UsingStatement -> Bool # (/=) :: UsingStatement -> UsingStatement -> Bool # | |
| Ord UsingStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: UsingStatement -> UsingStatement -> Ordering # (<) :: UsingStatement -> UsingStatement -> Bool # (<=) :: UsingStatement -> UsingStatement -> Bool # (>) :: UsingStatement -> UsingStatement -> Bool # (>=) :: UsingStatement -> UsingStatement -> Bool # max :: UsingStatement -> UsingStatement -> UsingStatement # min :: UsingStatement -> UsingStatement -> UsingStatement # | |
data ResourceAcquisition Source #
Constructors
| ResourceAcquisitionLocal LocalVariableDeclaration | |
| ResourceAcquisitionExpression Expression |
Instances
data YieldStatement Source #
Constructors
| YieldStatementReturn Expression | |
| YieldStatementBreak |
Instances
| Read YieldStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS YieldStatement # readList :: ReadS [YieldStatement] # | |
| Show YieldStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> YieldStatement -> ShowS # show :: YieldStatement -> String # showList :: [YieldStatement] -> ShowS # | |
| Eq YieldStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: YieldStatement -> YieldStatement -> Bool # (/=) :: YieldStatement -> YieldStatement -> Bool # | |
| Ord YieldStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: YieldStatement -> YieldStatement -> Ordering # (<) :: YieldStatement -> YieldStatement -> Bool # (<=) :: YieldStatement -> YieldStatement -> Bool # (>) :: YieldStatement -> YieldStatement -> Bool # (>=) :: YieldStatement -> YieldStatement -> Bool # max :: YieldStatement -> YieldStatement -> YieldStatement # min :: YieldStatement -> YieldStatement -> YieldStatement # | |
data CompilationUnit Source #
Constructors
| CompilationUnit | |
Instances
| Read CompilationUnit Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS CompilationUnit # readList :: ReadS [CompilationUnit] # | |
| Show CompilationUnit Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> CompilationUnit -> ShowS # show :: CompilationUnit -> String # showList :: [CompilationUnit] -> ShowS # | |
| Eq CompilationUnit Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: CompilationUnit -> CompilationUnit -> Bool # (/=) :: CompilationUnit -> CompilationUnit -> Bool # | |
| Ord CompilationUnit Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: CompilationUnit -> CompilationUnit -> Ordering # (<) :: CompilationUnit -> CompilationUnit -> Bool # (<=) :: CompilationUnit -> CompilationUnit -> Bool # (>) :: CompilationUnit -> CompilationUnit -> Bool # (>=) :: CompilationUnit -> CompilationUnit -> Bool # max :: CompilationUnit -> CompilationUnit -> CompilationUnit # min :: CompilationUnit -> CompilationUnit -> CompilationUnit # | |
data NamespaceDeclaration Source #
Constructors
| NamespaceDeclaration | |
Instances
data NamespaceBody Source #
Constructors
| NamespaceBody | |
Instances
| Read NamespaceBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NamespaceBody # readList :: ReadS [NamespaceBody] # | |
| Show NamespaceBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NamespaceBody -> ShowS # show :: NamespaceBody -> String # showList :: [NamespaceBody] -> ShowS # | |
| Eq NamespaceBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: NamespaceBody -> NamespaceBody -> Bool # (/=) :: NamespaceBody -> NamespaceBody -> Bool # | |
| Ord NamespaceBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NamespaceBody -> NamespaceBody -> Ordering # (<) :: NamespaceBody -> NamespaceBody -> Bool # (<=) :: NamespaceBody -> NamespaceBody -> Bool # (>) :: NamespaceBody -> NamespaceBody -> Bool # (>=) :: NamespaceBody -> NamespaceBody -> Bool # max :: NamespaceBody -> NamespaceBody -> NamespaceBody # min :: NamespaceBody -> NamespaceBody -> NamespaceBody # | |
data UsingDirective Source #
Constructors
| UsingDirectiveAlias UsingAliasDirective | |
| UsingDirectiveNamespace NamespaceName | |
| UsingDirectiveStatic TypeName |
Instances
| Read UsingDirective Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS UsingDirective # readList :: ReadS [UsingDirective] # | |
| Show UsingDirective Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> UsingDirective -> ShowS # show :: UsingDirective -> String # showList :: [UsingDirective] -> ShowS # | |
| Eq UsingDirective Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: UsingDirective -> UsingDirective -> Bool # (/=) :: UsingDirective -> UsingDirective -> Bool # | |
| Ord UsingDirective Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: UsingDirective -> UsingDirective -> Ordering # (<) :: UsingDirective -> UsingDirective -> Bool # (<=) :: UsingDirective -> UsingDirective -> Bool # (>) :: UsingDirective -> UsingDirective -> Bool # (>=) :: UsingDirective -> UsingDirective -> Bool # max :: UsingDirective -> UsingDirective -> UsingDirective # min :: UsingDirective -> UsingDirective -> UsingDirective # | |
data UsingAliasDirective Source #
Constructors
| UsingAliasDirective | |
Instances
data NamespaceMemberDeclaration Source #
Constructors
| NamespaceMemberDeclarationNamespace NamespaceDeclaration | |
| NamespaceMemberDeclarationType TypeDeclaration |
Instances
data TypeDeclaration Source #
Constructors
Instances
| Read TypeDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS TypeDeclaration # readList :: ReadS [TypeDeclaration] # | |
| Show TypeDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> TypeDeclaration -> ShowS # show :: TypeDeclaration -> String # showList :: [TypeDeclaration] -> ShowS # | |
| Eq TypeDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: TypeDeclaration -> TypeDeclaration -> Bool # (/=) :: TypeDeclaration -> TypeDeclaration -> Bool # | |
| Ord TypeDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: TypeDeclaration -> TypeDeclaration -> Ordering # (<) :: TypeDeclaration -> TypeDeclaration -> Bool # (<=) :: TypeDeclaration -> TypeDeclaration -> Bool # (>) :: TypeDeclaration -> TypeDeclaration -> Bool # (>=) :: TypeDeclaration -> TypeDeclaration -> Bool # max :: TypeDeclaration -> TypeDeclaration -> TypeDeclaration # min :: TypeDeclaration -> TypeDeclaration -> TypeDeclaration # | |
data QualifiedAliasMember Source #
Constructors
| QualifiedAliasMember | |
Instances
data ClassDeclaration Source #
Constructors
Instances
data ClassModifier Source #
Constructors
| ClassModifierNew | |
| ClassModifierPublic | |
| ClassModifierProtected | |
| ClassModifierInternal | |
| ClassModifierPrivate | |
| ClassModifierAbstract | |
| ClassModifierSealed | |
| ClassModifierStatic | |
| ClassModifierUnsafe |
Instances
| Read ClassModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ClassModifier # readList :: ReadS [ClassModifier] # | |
| Show ClassModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ClassModifier -> ShowS # show :: ClassModifier -> String # showList :: [ClassModifier] -> ShowS # | |
| Eq ClassModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ClassModifier -> ClassModifier -> Bool # (/=) :: ClassModifier -> ClassModifier -> Bool # | |
| Ord ClassModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ClassModifier -> ClassModifier -> Ordering # (<) :: ClassModifier -> ClassModifier -> Bool # (<=) :: ClassModifier -> ClassModifier -> Bool # (>) :: ClassModifier -> ClassModifier -> Bool # (>=) :: ClassModifier -> ClassModifier -> Bool # max :: ClassModifier -> ClassModifier -> ClassModifier # min :: ClassModifier -> ClassModifier -> ClassModifier # | |
newtype TypeParameterList Source #
Constructors
| TypeParameterList | |
Fields | |
Instances
data TypeParameterPart Source #
Constructors
| TypeParameterPart | |
Instances
Constructors
| ClassBaseClass (Maybe ClassType) | |
| ClassBaseInterfaces [InterfaceType] |
Instances
| Read ClassBase Source # | |
| Show ClassBase Source # | |
| Eq ClassBase Source # | |
| Ord ClassBase Source # | |
_ClassBase :: Name Source #
data TypeParameterConstraintsClause Source #
Constructors
| TypeParameterConstraintsClause | |
Instances
data TypeParameterConstraints Source #
Constructors
| TypeParameterConstraints | |
Instances
data PrimaryConstraint Source #
Constructors
| PrimaryConstraintClassType ClassType | |
| PrimaryConstraintClass | |
| PrimaryConstraintStruct | |
| PrimaryConstraintUnmanaged |
Instances
newtype SecondaryConstraints Source #
Constructors
| SecondaryConstraints | |
Fields | |
Instances
data SecondaryConstraint Source #
Instances
Constructors
| ClassBody | |
Fields | |
Instances
| Read ClassBody Source # | |
| Show ClassBody Source # | |
| Eq ClassBody Source # | |
| Ord ClassBody Source # | |
_ClassBody :: Name Source #
data ClassMemberDeclaration Source #
Constructors
Instances
data ConstantDeclaration Source #
Constructors
| ConstantDeclaration | |
Instances
data ConstantModifier Source #
Constructors
| ConstantModifierNew | |
| ConstantModifierPublic | |
| ConstantModifierProtected | |
| ConstantModifierInternal | |
| ConstantModifierPrivate |
Instances
data FieldDeclaration Source #
Constructors
| FieldDeclaration | |
Instances
data FieldModifier Source #
Constructors
| FieldModifierNew | |
| FieldModifierPublic | |
| FieldModifierProtected | |
| FieldModifierInternal | |
| FieldModifierPrivate | |
| FieldModifierStatic | |
| FieldModifierReadonly | |
| FieldModifierVolatile | |
| FieldModifierUnsafe |
Instances
| Read FieldModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS FieldModifier # readList :: ReadS [FieldModifier] # | |
| Show FieldModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> FieldModifier -> ShowS # show :: FieldModifier -> String # showList :: [FieldModifier] -> ShowS # | |
| Eq FieldModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: FieldModifier -> FieldModifier -> Bool # (/=) :: FieldModifier -> FieldModifier -> Bool # | |
| Ord FieldModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: FieldModifier -> FieldModifier -> Ordering # (<) :: FieldModifier -> FieldModifier -> Bool # (<=) :: FieldModifier -> FieldModifier -> Bool # (>) :: FieldModifier -> FieldModifier -> Bool # (>=) :: FieldModifier -> FieldModifier -> Bool # max :: FieldModifier -> FieldModifier -> FieldModifier # min :: FieldModifier -> FieldModifier -> FieldModifier # | |
newtype VariableDeclarators Source #
Constructors
| VariableDeclarators | |
Fields | |
Instances
data VariableDeclarator Source #
Constructors
| VariableDeclarator | |
Instances
data MethodDeclaration Source #
Constructors
| MethodDeclarationStandard StandardMethodDeclaration | |
| MethodDeclarationRefReturn RefReturnMethodDeclaration |
Instances
data StandardMethodDeclaration Source #
Constructors
| StandardMethodDeclaration | |
Instances
data RefReturnMethodDeclaration Source #
Constructors
Instances
data MethodModifiers Source #
Constructors
| MethodModifiers | |
Fields | |
Instances
| Read MethodModifiers Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS MethodModifiers # readList :: ReadS [MethodModifiers] # | |
| Show MethodModifiers Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> MethodModifiers -> ShowS # show :: MethodModifiers -> String # showList :: [MethodModifiers] -> ShowS # | |
| Eq MethodModifiers Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: MethodModifiers -> MethodModifiers -> Bool # (/=) :: MethodModifiers -> MethodModifiers -> Bool # | |
| Ord MethodModifiers Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: MethodModifiers -> MethodModifiers -> Ordering # (<) :: MethodModifiers -> MethodModifiers -> Bool # (<=) :: MethodModifiers -> MethodModifiers -> Bool # (>) :: MethodModifiers -> MethodModifiers -> Bool # (>=) :: MethodModifiers -> MethodModifiers -> Bool # max :: MethodModifiers -> MethodModifiers -> MethodModifiers # min :: MethodModifiers -> MethodModifiers -> MethodModifiers # | |
Constructors
| RefKindRef | |
| RefKindRefReadonly |
_RefKind_ref :: Name Source #
data MethodHeader Source #
Constructors
| MethodHeader | |
Instances
| Read MethodHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS MethodHeader # readList :: ReadS [MethodHeader] # | |
| Show MethodHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> MethodHeader -> ShowS # show :: MethodHeader -> String # showList :: [MethodHeader] -> ShowS # | |
| Eq MethodHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord MethodHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: MethodHeader -> MethodHeader -> Ordering # (<) :: MethodHeader -> MethodHeader -> Bool # (<=) :: MethodHeader -> MethodHeader -> Bool # (>) :: MethodHeader -> MethodHeader -> Bool # (>=) :: MethodHeader -> MethodHeader -> Bool # max :: MethodHeader -> MethodHeader -> MethodHeader # min :: MethodHeader -> MethodHeader -> MethodHeader # | |
_MethodHeader :: Name Source #
data MethodModifier Source #
Constructors
| MethodModifierRef RefMethodModifier | |
| MethodModifierAsync |
Instances
| Read MethodModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS MethodModifier # readList :: ReadS [MethodModifier] # | |
| Show MethodModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> MethodModifier -> ShowS # show :: MethodModifier -> String # showList :: [MethodModifier] -> ShowS # | |
| Eq MethodModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: MethodModifier -> MethodModifier -> Bool # (/=) :: MethodModifier -> MethodModifier -> Bool # | |
| Ord MethodModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: MethodModifier -> MethodModifier -> Ordering # (<) :: MethodModifier -> MethodModifier -> Bool # (<=) :: MethodModifier -> MethodModifier -> Bool # (>) :: MethodModifier -> MethodModifier -> Bool # (>=) :: MethodModifier -> MethodModifier -> Bool # max :: MethodModifier -> MethodModifier -> MethodModifier # min :: MethodModifier -> MethodModifier -> MethodModifier # | |
data RefMethodModifier Source #
Constructors
Instances
data ReturnType Source #
Constructors
| ReturnTypeRef Type | |
| ReturnTypeVoid |
Instances
| Read ReturnType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ReturnType # readList :: ReadS [ReturnType] # readPrec :: ReadPrec ReturnType # readListPrec :: ReadPrec [ReturnType] # | |
| Show ReturnType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ReturnType -> ShowS # show :: ReturnType -> String # showList :: [ReturnType] -> ShowS # | |
| Eq ReturnType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord ReturnType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ReturnType -> ReturnType -> Ordering # (<) :: ReturnType -> ReturnType -> Bool # (<=) :: ReturnType -> ReturnType -> Bool # (>) :: ReturnType -> ReturnType -> Bool # (>=) :: ReturnType -> ReturnType -> Bool # max :: ReturnType -> ReturnType -> ReturnType # min :: ReturnType -> ReturnType -> ReturnType # | |
_ReturnType :: Name Source #
data MemberName Source #
Constructors
| MemberName | |
Instances
| Read MemberName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS MemberName # readList :: ReadS [MemberName] # readPrec :: ReadPrec MemberName # readListPrec :: ReadPrec [MemberName] # | |
| Show MemberName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> MemberName -> ShowS # show :: MemberName -> String # showList :: [MemberName] -> ShowS # | |
| Eq MemberName Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord MemberName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: MemberName -> MemberName -> Ordering # (<) :: MemberName -> MemberName -> Bool # (<=) :: MemberName -> MemberName -> Bool # (>) :: MemberName -> MemberName -> Bool # (>=) :: MemberName -> MemberName -> Bool # max :: MemberName -> MemberName -> MemberName # min :: MemberName -> MemberName -> MemberName # | |
_MemberName :: Name Source #
data MethodBody Source #
Constructors
| MethodBodyBlock Block | |
| MethodBodyNullConditionalInvocation NullConditionalInvocationExpression | |
| MethodBodyExpression Expression | |
| MethodBodyEmpty |
Instances
| Read MethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS MethodBody # readList :: ReadS [MethodBody] # readPrec :: ReadPrec MethodBody # readListPrec :: ReadPrec [MethodBody] # | |
| Show MethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> MethodBody -> ShowS # show :: MethodBody -> String # showList :: [MethodBody] -> ShowS # | |
| Eq MethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord MethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: MethodBody -> MethodBody -> Ordering # (<) :: MethodBody -> MethodBody -> Bool # (<=) :: MethodBody -> MethodBody -> Bool # (>) :: MethodBody -> MethodBody -> Bool # (>=) :: MethodBody -> MethodBody -> Bool # max :: MethodBody -> MethodBody -> MethodBody # min :: MethodBody -> MethodBody -> MethodBody # | |
_MethodBody :: Name Source #
data RefMethodBody Source #
Instances
| Read RefMethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS RefMethodBody # readList :: ReadS [RefMethodBody] # | |
| Show RefMethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> RefMethodBody -> ShowS # show :: RefMethodBody -> String # showList :: [RefMethodBody] -> ShowS # | |
| Eq RefMethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: RefMethodBody -> RefMethodBody -> Bool # (/=) :: RefMethodBody -> RefMethodBody -> Bool # | |
| Ord RefMethodBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: RefMethodBody -> RefMethodBody -> Ordering # (<) :: RefMethodBody -> RefMethodBody -> Bool # (<=) :: RefMethodBody -> RefMethodBody -> Bool # (>) :: RefMethodBody -> RefMethodBody -> Bool # (>=) :: RefMethodBody -> RefMethodBody -> Bool # max :: RefMethodBody -> RefMethodBody -> RefMethodBody # min :: RefMethodBody -> RefMethodBody -> RefMethodBody # | |
data FormalParameterList Source #
Constructors
| FormalParameterList | |
Instances
data FixedParameter Source #
Constructors
| FixedParameter | |
Instances
| Read FixedParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS FixedParameter # readList :: ReadS [FixedParameter] # | |
| Show FixedParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> FixedParameter -> ShowS # show :: FixedParameter -> String # showList :: [FixedParameter] -> ShowS # | |
| Eq FixedParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: FixedParameter -> FixedParameter -> Bool # (/=) :: FixedParameter -> FixedParameter -> Bool # | |
| Ord FixedParameter Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: FixedParameter -> FixedParameter -> Ordering # (<) :: FixedParameter -> FixedParameter -> Bool # (<=) :: FixedParameter -> FixedParameter -> Bool # (>) :: FixedParameter -> FixedParameter -> Bool # (>=) :: FixedParameter -> FixedParameter -> Bool # max :: FixedParameter -> FixedParameter -> FixedParameter # min :: FixedParameter -> FixedParameter -> FixedParameter # | |
data ParameterModifier Source #
Instances
data ParameterModeModifier Source #
Instances
data ParameterArray Source #
Constructors
| ParameterArray | |
Instances
| Read ParameterArray Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ParameterArray # readList :: ReadS [ParameterArray] # | |
| Show ParameterArray Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ParameterArray -> ShowS # show :: ParameterArray -> String # showList :: [ParameterArray] -> ShowS # | |
| Eq ParameterArray Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ParameterArray -> ParameterArray -> Bool # (/=) :: ParameterArray -> ParameterArray -> Bool # | |
| Ord ParameterArray Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ParameterArray -> ParameterArray -> Ordering # (<) :: ParameterArray -> ParameterArray -> Bool # (<=) :: ParameterArray -> ParameterArray -> Bool # (>) :: ParameterArray -> ParameterArray -> Bool # (>=) :: ParameterArray -> ParameterArray -> Bool # max :: ParameterArray -> ParameterArray -> ParameterArray # min :: ParameterArray -> ParameterArray -> ParameterArray # | |
data PropertyDeclaration Source #
Constructors
| PropertyDeclarationStandard StandardPropertyDeclaration | |
| PropertyDeclarationRefReturn RefReturnPropertyDeclaration |
Instances
data StandardPropertyDeclaration Source #
Constructors
| StandardPropertyDeclaration | |
Instances
data RefReturnPropertyDeclaration Source #
Constructors
Instances
data PropertyModifier Source #
Constructors
Instances
data PropertyBody Source #
Instances
| Read PropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS PropertyBody # readList :: ReadS [PropertyBody] # | |
| Show PropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> PropertyBody -> ShowS # show :: PropertyBody -> String # showList :: [PropertyBody] -> ShowS # | |
| Eq PropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord PropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: PropertyBody -> PropertyBody -> Ordering # (<) :: PropertyBody -> PropertyBody -> Bool # (<=) :: PropertyBody -> PropertyBody -> Bool # (>) :: PropertyBody -> PropertyBody -> Bool # (>=) :: PropertyBody -> PropertyBody -> Bool # max :: PropertyBody -> PropertyBody -> PropertyBody # min :: PropertyBody -> PropertyBody -> PropertyBody # | |
_PropertyBody :: Name Source #
data BlockPropertyBody Source #
Constructors
| BlockPropertyBody | |
Instances
data RefPropertyBody Source #
Instances
| Read RefPropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS RefPropertyBody # readList :: ReadS [RefPropertyBody] # | |
| Show RefPropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> RefPropertyBody -> ShowS # show :: RefPropertyBody -> String # showList :: [RefPropertyBody] -> ShowS # | |
| Eq RefPropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: RefPropertyBody -> RefPropertyBody -> Bool # (/=) :: RefPropertyBody -> RefPropertyBody -> Bool # | |
| Ord RefPropertyBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: RefPropertyBody -> RefPropertyBody -> Ordering # (<) :: RefPropertyBody -> RefPropertyBody -> Bool # (<=) :: RefPropertyBody -> RefPropertyBody -> Bool # (>) :: RefPropertyBody -> RefPropertyBody -> Bool # (>=) :: RefPropertyBody -> RefPropertyBody -> Bool # max :: RefPropertyBody -> RefPropertyBody -> RefPropertyBody # min :: RefPropertyBody -> RefPropertyBody -> RefPropertyBody # | |
data AccessorDeclarations Source #
Constructors
| AccessorDeclarationsGet (Maybe AccessorDeclaration) | |
| AccessorDeclarationsSet (Maybe AccessorDeclaration) |
Instances
data AccessorDeclaration Source #
Constructors
| AccessorDeclaration | |
Instances
data AccessorModifier Source #
Constructors
Instances
data AccessorBody Source #
Instances
| Read AccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS AccessorBody # readList :: ReadS [AccessorBody] # | |
| Show AccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> AccessorBody -> ShowS # show :: AccessorBody -> String # showList :: [AccessorBody] -> ShowS # | |
| Eq AccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord AccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: AccessorBody -> AccessorBody -> Ordering # (<) :: AccessorBody -> AccessorBody -> Bool # (<=) :: AccessorBody -> AccessorBody -> Bool # (>) :: AccessorBody -> AccessorBody -> Bool # (>=) :: AccessorBody -> AccessorBody -> Bool # max :: AccessorBody -> AccessorBody -> AccessorBody # min :: AccessorBody -> AccessorBody -> AccessorBody # | |
_AccessorBody :: Name Source #
data RefGetAccessorDeclaration Source #
Constructors
| RefGetAccessorDeclaration | |
Instances
data RefAccessorBody Source #
Instances
| Read RefAccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS RefAccessorBody # readList :: ReadS [RefAccessorBody] # | |
| Show RefAccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> RefAccessorBody -> ShowS # show :: RefAccessorBody -> String # showList :: [RefAccessorBody] -> ShowS # | |
| Eq RefAccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: RefAccessorBody -> RefAccessorBody -> Bool # (/=) :: RefAccessorBody -> RefAccessorBody -> Bool # | |
| Ord RefAccessorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: RefAccessorBody -> RefAccessorBody -> Ordering # (<) :: RefAccessorBody -> RefAccessorBody -> Bool # (<=) :: RefAccessorBody -> RefAccessorBody -> Bool # (>) :: RefAccessorBody -> RefAccessorBody -> Bool # (>=) :: RefAccessorBody -> RefAccessorBody -> Bool # max :: RefAccessorBody -> RefAccessorBody -> RefAccessorBody # min :: RefAccessorBody -> RefAccessorBody -> RefAccessorBody # | |
data EventDeclaration Source #
Constructors
| EventDeclarationStandard StandardEventDeclaration | |
| EventDeclarationAccessors AccessorsEventDeclaration |
Instances
data StandardEventDeclaration Source #
Constructors
| StandardEventDeclaration | |
Instances
data AccessorsEventDeclaration Source #
Constructors
| AccessorsEventDeclaration | |
Instances
data EventModifier Source #
Constructors
Instances
| Read EventModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS EventModifier # readList :: ReadS [EventModifier] # | |
| Show EventModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> EventModifier -> ShowS # show :: EventModifier -> String # showList :: [EventModifier] -> ShowS # | |
| Eq EventModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: EventModifier -> EventModifier -> Bool # (/=) :: EventModifier -> EventModifier -> Bool # | |
| Ord EventModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: EventModifier -> EventModifier -> Ordering # (<) :: EventModifier -> EventModifier -> Bool # (<=) :: EventModifier -> EventModifier -> Bool # (>) :: EventModifier -> EventModifier -> Bool # (>=) :: EventModifier -> EventModifier -> Bool # max :: EventModifier -> EventModifier -> EventModifier # min :: EventModifier -> EventModifier -> EventModifier # | |
data EventAccessorDeclarations Source #
Constructors
| EventAccessorDeclarationsAdd AddRemoveAccessorDeclaration | |
| EventAccessorDeclarationsRemove AddRemoveAccessorDeclaration |
Instances
data AddRemoveAccessorDeclaration Source #
Constructors
| AddRemoveAccessorDeclaration | |
Instances
data IndexerDeclaration Source #
Constructors
| IndexerDeclarationStandard StandardIndexerDeclaration | |
| IndexerDeclarationRef RefIndexerDeclaration |
Instances
data StandardIndexerDeclaration Source #
Constructors
| StandardIndexerDeclaration | |
Instances
data RefIndexerDeclaration Source #
Constructors
| RefIndexerDeclaration | |
Instances
data IndexerModifier Source #
Constructors
Instances
| Read IndexerModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS IndexerModifier # readList :: ReadS [IndexerModifier] # | |
| Show IndexerModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> IndexerModifier -> ShowS # show :: IndexerModifier -> String # showList :: [IndexerModifier] -> ShowS # | |
| Eq IndexerModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: IndexerModifier -> IndexerModifier -> Bool # (/=) :: IndexerModifier -> IndexerModifier -> Bool # | |
| Ord IndexerModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: IndexerModifier -> IndexerModifier -> Ordering # (<) :: IndexerModifier -> IndexerModifier -> Bool # (<=) :: IndexerModifier -> IndexerModifier -> Bool # (>) :: IndexerModifier -> IndexerModifier -> Bool # (>=) :: IndexerModifier -> IndexerModifier -> Bool # max :: IndexerModifier -> IndexerModifier -> IndexerModifier # min :: IndexerModifier -> IndexerModifier -> IndexerModifier # | |
data IndexerDeclarator Source #
Constructors
| IndexerDeclarator | |
Instances
data IndexerBody Source #
Instances
| Read IndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS IndexerBody # readList :: ReadS [IndexerBody] # readPrec :: ReadPrec IndexerBody # readListPrec :: ReadPrec [IndexerBody] # | |
| Show IndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> IndexerBody -> ShowS # show :: IndexerBody -> String # showList :: [IndexerBody] -> ShowS # | |
| Eq IndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord IndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: IndexerBody -> IndexerBody -> Ordering # (<) :: IndexerBody -> IndexerBody -> Bool # (<=) :: IndexerBody -> IndexerBody -> Bool # (>) :: IndexerBody -> IndexerBody -> Bool # (>=) :: IndexerBody -> IndexerBody -> Bool # max :: IndexerBody -> IndexerBody -> IndexerBody # min :: IndexerBody -> IndexerBody -> IndexerBody # | |
_IndexerBody :: Name Source #
data RefIndexerBody Source #
Instances
| Read RefIndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS RefIndexerBody # readList :: ReadS [RefIndexerBody] # | |
| Show RefIndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> RefIndexerBody -> ShowS # show :: RefIndexerBody -> String # showList :: [RefIndexerBody] -> ShowS # | |
| Eq RefIndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: RefIndexerBody -> RefIndexerBody -> Bool # (/=) :: RefIndexerBody -> RefIndexerBody -> Bool # | |
| Ord RefIndexerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: RefIndexerBody -> RefIndexerBody -> Ordering # (<) :: RefIndexerBody -> RefIndexerBody -> Bool # (<=) :: RefIndexerBody -> RefIndexerBody -> Bool # (>) :: RefIndexerBody -> RefIndexerBody -> Bool # (>=) :: RefIndexerBody -> RefIndexerBody -> Bool # max :: RefIndexerBody -> RefIndexerBody -> RefIndexerBody # min :: RefIndexerBody -> RefIndexerBody -> RefIndexerBody # | |
data OperatorDeclaration Source #
Constructors
| OperatorDeclaration | |
Instances
data OperatorModifier Source #
Constructors
| OperatorModifierPublic | |
| OperatorModifierStatic | |
| OperatorModifierExtern | |
| OperatorModifierUnsafe |
Instances
data OperatorDeclarator Source #
Constructors
| OperatorDeclaratorUnary UnaryOperatorDeclarator | |
| OperatorDeclaratorBinary BinaryOperatorDeclarator | |
| OperatorDeclaratorConversion ConversionOperatorDeclarator |
Instances
data UnaryOperatorDeclarator Source #
Constructors
| UnaryOperatorDeclarator | |
Instances
data OverloadableUnaryOperator Source #
Constructors
Instances
data BinaryOperatorDeclarator Source #
Constructors
| BinaryOperatorDeclarator | |
Instances
data OverloadableBinaryOperator Source #
Constructors
Instances
data ConversionOperatorDeclarator Source #
Constructors
| ConversionOperatorDeclarator | |
Instances
data ConversionKind Source #
Constructors
| ConversionKindImplicit | |
| ConversionKindExplicit |
Instances
| Read ConversionKind Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ConversionKind # readList :: ReadS [ConversionKind] # | |
| Show ConversionKind Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ConversionKind -> ShowS # show :: ConversionKind -> String # showList :: [ConversionKind] -> ShowS # | |
| Eq ConversionKind Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ConversionKind -> ConversionKind -> Bool # (/=) :: ConversionKind -> ConversionKind -> Bool # | |
| Ord ConversionKind Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ConversionKind -> ConversionKind -> Ordering # (<) :: ConversionKind -> ConversionKind -> Bool # (<=) :: ConversionKind -> ConversionKind -> Bool # (>) :: ConversionKind -> ConversionKind -> Bool # (>=) :: ConversionKind -> ConversionKind -> Bool # max :: ConversionKind -> ConversionKind -> ConversionKind # min :: ConversionKind -> ConversionKind -> ConversionKind # | |
data OperatorBody Source #
Instances
| Read OperatorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS OperatorBody # readList :: ReadS [OperatorBody] # | |
| Show OperatorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> OperatorBody -> ShowS # show :: OperatorBody -> String # showList :: [OperatorBody] -> ShowS # | |
| Eq OperatorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord OperatorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: OperatorBody -> OperatorBody -> Ordering # (<) :: OperatorBody -> OperatorBody -> Bool # (<=) :: OperatorBody -> OperatorBody -> Bool # (>) :: OperatorBody -> OperatorBody -> Bool # (>=) :: OperatorBody -> OperatorBody -> Bool # max :: OperatorBody -> OperatorBody -> OperatorBody # min :: OperatorBody -> OperatorBody -> OperatorBody # | |
_OperatorBody :: Name Source #
data ConstructorDeclaration Source #
Constructors
| ConstructorDeclaration | |
Instances
data ConstructorModifier Source #
Constructors
| ConstructorModifierPublic | |
| ConstructorModifierProtected | |
| ConstructorModifierInternal | |
| ConstructorModifierPrivate | |
| ConstructorModifierExtern | |
| ConstructorModifierUnsafe |
Instances
data ConstructorDeclarator Source #
Constructors
| ConstructorDeclarator | |
Instances
data ConstructorInitializer Source #
Constructors
| ConstructorInitializerBase (Maybe ArgumentList) | |
| ConstructorInitializerThis (Maybe ArgumentList) |
Instances
data ConstructorBody Source #
Instances
| Read ConstructorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS ConstructorBody # readList :: ReadS [ConstructorBody] # | |
| Show ConstructorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> ConstructorBody -> ShowS # show :: ConstructorBody -> String # showList :: [ConstructorBody] -> ShowS # | |
| Eq ConstructorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: ConstructorBody -> ConstructorBody -> Bool # (/=) :: ConstructorBody -> ConstructorBody -> Bool # | |
| Ord ConstructorBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: ConstructorBody -> ConstructorBody -> Ordering # (<) :: ConstructorBody -> ConstructorBody -> Bool # (<=) :: ConstructorBody -> ConstructorBody -> Bool # (>) :: ConstructorBody -> ConstructorBody -> Bool # (>=) :: ConstructorBody -> ConstructorBody -> Bool # max :: ConstructorBody -> ConstructorBody -> ConstructorBody # min :: ConstructorBody -> ConstructorBody -> ConstructorBody # | |
data StaticConstructorDeclaration Source #
Constructors
| StaticConstructorDeclaration | |
Instances
data StaticConstructorModifiers Source #
Constructors
| StaticConstructorModifiers | |
Instances
data StaticConstructorBody Source #
Constructors
| StaticConstructorBodyBlock Block | |
| StaticConstructorBodyExpression Expression | |
| StaticConstructorBodyEmpty |
Instances
data FinalizerDeclaration Source #
Constructors
| FinalizerDeclaration | |
Instances
data FinalizerBody Source #
Instances
| Read FinalizerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS FinalizerBody # readList :: ReadS [FinalizerBody] # | |
| Show FinalizerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> FinalizerBody -> ShowS # show :: FinalizerBody -> String # showList :: [FinalizerBody] -> ShowS # | |
| Eq FinalizerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: FinalizerBody -> FinalizerBody -> Bool # (/=) :: FinalizerBody -> FinalizerBody -> Bool # | |
| Ord FinalizerBody Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: FinalizerBody -> FinalizerBody -> Ordering # (<) :: FinalizerBody -> FinalizerBody -> Bool # (<=) :: FinalizerBody -> FinalizerBody -> Bool # (>) :: FinalizerBody -> FinalizerBody -> Bool # (>=) :: FinalizerBody -> FinalizerBody -> Bool # max :: FinalizerBody -> FinalizerBody -> FinalizerBody # min :: FinalizerBody -> FinalizerBody -> FinalizerBody # | |
data StructDeclaration Source #
Constructors
Instances
data StructModifier Source #
Constructors
| StructModifierNew | |
| StructModifierPublic | |
| StructModifierProtected | |
| StructModifierInternal | |
| StructModifierPrivate | |
| StructModifierReadonly | |
| StructModifierUnsafe |
Instances
| Read StructModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS StructModifier # readList :: ReadS [StructModifier] # | |
| Show StructModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> StructModifier -> ShowS # show :: StructModifier -> String # showList :: [StructModifier] -> ShowS # | |
| Eq StructModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: StructModifier -> StructModifier -> Bool # (/=) :: StructModifier -> StructModifier -> Bool # | |
| Ord StructModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: StructModifier -> StructModifier -> Ordering # (<) :: StructModifier -> StructModifier -> Bool # (<=) :: StructModifier -> StructModifier -> Bool # (>) :: StructModifier -> StructModifier -> Bool # (>=) :: StructModifier -> StructModifier -> Bool # max :: StructModifier -> StructModifier -> StructModifier # min :: StructModifier -> StructModifier -> StructModifier # | |
data StructMemberDeclaration Source #
Constructors
Instances
newtype ArrayInitializer Source #
Constructors
| ArrayInitializer | |
Fields | |
Instances
data VariableInitializer Source #
Instances
data InterfaceDeclaration Source #
Constructors
Instances
data InterfaceModifier Source #
Constructors
| InterfaceModifierNew | |
| InterfaceModifierPublic | |
| InterfaceModifierProtected | |
| InterfaceModifierInternal | |
| InterfaceModifierPrivate | |
| InterfaceModifierUnsafe |
Instances
newtype VariantTypeParameters Source #
Constructors
| VariantTypeParameters | |
Fields | |
Instances
data VariantTypeParameter Source #
Constructors
| VariantTypeParameter | |
Instances
data VarianceAnnotation Source #
Constructors
| VarianceAnnotationIn | |
| VarianceAnnotationOut |
Instances
data InterfaceMemberDeclaration Source #
Constructors
Instances
data InterfaceMethodDeclaration Source #
Constructors
| InterfaceMethodDeclaration | |
Instances
data InterfaceMethodHeader Source #
Constructors
| InterfaceMethodHeader | |
Instances
data InterfacePropertyDeclaration Source #
Constructors
| InterfacePropertyDeclaration | |
Fields | |
Instances
data InterfaceAccessors Source #
Constructors
| InterfaceAccessors | |
Instances
data InterfaceEventDeclaration Source #
Constructors
| InterfaceEventDeclaration | |
Instances
data InterfaceIndexerDeclaration Source #
Constructors
Instances
data EnumDeclaration Source #
Constructors
| EnumDeclaration | |
Instances
| Read EnumDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS EnumDeclaration # readList :: ReadS [EnumDeclaration] # | |
| Show EnumDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> EnumDeclaration -> ShowS # show :: EnumDeclaration -> String # showList :: [EnumDeclaration] -> ShowS # | |
| Eq EnumDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: EnumDeclaration -> EnumDeclaration -> Bool # (/=) :: EnumDeclaration -> EnumDeclaration -> Bool # | |
| Ord EnumDeclaration Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: EnumDeclaration -> EnumDeclaration -> Ordering # (<) :: EnumDeclaration -> EnumDeclaration -> Bool # (<=) :: EnumDeclaration -> EnumDeclaration -> Bool # (>) :: EnumDeclaration -> EnumDeclaration -> Bool # (>=) :: EnumDeclaration -> EnumDeclaration -> Bool # max :: EnumDeclaration -> EnumDeclaration -> EnumDeclaration # min :: EnumDeclaration -> EnumDeclaration -> EnumDeclaration # | |
Constructors
| EnumBaseType IntegralType | |
| EnumBaseName TypeName |
Constructors
| EnumBody | |
Fields | |
data EnumModifier Source #
Constructors
| EnumModifierNew | |
| EnumModifierPublic | |
| EnumModifierProtected | |
| EnumModifierInternal | |
| EnumModifierPrivate |
Instances
| Read EnumModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS EnumModifier # readList :: ReadS [EnumModifier] # | |
| Show EnumModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> EnumModifier -> ShowS # show :: EnumModifier -> String # showList :: [EnumModifier] -> ShowS # | |
| Eq EnumModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord EnumModifier Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: EnumModifier -> EnumModifier -> Ordering # (<) :: EnumModifier -> EnumModifier -> Bool # (<=) :: EnumModifier -> EnumModifier -> Bool # (>) :: EnumModifier -> EnumModifier -> Bool # (>=) :: EnumModifier -> EnumModifier -> Bool # max :: EnumModifier -> EnumModifier -> EnumModifier # min :: EnumModifier -> EnumModifier -> EnumModifier # | |
_EnumModifier :: Name Source #
data EnumMemberDeclaration Source #
Constructors
| EnumMemberDeclaration | |
Instances
data DelegateDeclaration Source #
Constructors
| DelegateDeclaration | |
Instances
data DelegateHeader Source #
Constructors
| DelegateHeader | |
Instances
| Read DelegateHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS DelegateHeader # readList :: ReadS [DelegateHeader] # | |
| Show DelegateHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> DelegateHeader -> ShowS # show :: DelegateHeader -> String # showList :: [DelegateHeader] -> ShowS # | |
| Eq DelegateHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: DelegateHeader -> DelegateHeader -> Bool # (/=) :: DelegateHeader -> DelegateHeader -> Bool # | |
| Ord DelegateHeader Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: DelegateHeader -> DelegateHeader -> Ordering # (<) :: DelegateHeader -> DelegateHeader -> Bool # (<=) :: DelegateHeader -> DelegateHeader -> Bool # (>) :: DelegateHeader -> DelegateHeader -> Bool # (>=) :: DelegateHeader -> DelegateHeader -> Bool # max :: DelegateHeader -> DelegateHeader -> DelegateHeader # min :: DelegateHeader -> DelegateHeader -> DelegateHeader # | |
data DelegateModifier Source #
Constructors
| DelegateModifierNew | |
| DelegateModifierPublic | |
| DelegateModifierProtected | |
| DelegateModifierInternal | |
| DelegateModifierPrivate | |
| DelegateModifierUnsafe |
Instances
data GlobalAttributeSection Source #
Constructors
| GlobalAttributeSection | |
Instances
newtype Attributes Source #
Constructors
| Attributes | |
Fields | |
Instances
| Read Attributes Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS Attributes # readList :: ReadS [Attributes] # readPrec :: ReadPrec Attributes # readListPrec :: ReadPrec [Attributes] # | |
| Show Attributes Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> Attributes -> ShowS # show :: Attributes -> String # showList :: [Attributes] -> ShowS # | |
| Eq Attributes Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord Attributes Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: Attributes -> Attributes -> Ordering # (<) :: Attributes -> Attributes -> Bool # (<=) :: Attributes -> Attributes -> Bool # (>) :: Attributes -> Attributes -> Bool # (>=) :: Attributes -> Attributes -> Bool # max :: Attributes -> Attributes -> Attributes # min :: Attributes -> Attributes -> Attributes # | |
_Attributes :: Name Source #
data AttributeSection Source #
Constructors
| AttributeSection | |
Instances
data AttributeTarget Source #
Instances
| Read AttributeTarget Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS AttributeTarget # readList :: ReadS [AttributeTarget] # | |
| Show AttributeTarget Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> AttributeTarget -> ShowS # show :: AttributeTarget -> String # showList :: [AttributeTarget] -> ShowS # | |
| Eq AttributeTarget Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: AttributeTarget -> AttributeTarget -> Bool # (/=) :: AttributeTarget -> AttributeTarget -> Bool # | |
| Ord AttributeTarget Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: AttributeTarget -> AttributeTarget -> Ordering # (<) :: AttributeTarget -> AttributeTarget -> Bool # (<=) :: AttributeTarget -> AttributeTarget -> Bool # (>) :: AttributeTarget -> AttributeTarget -> Bool # (>=) :: AttributeTarget -> AttributeTarget -> Bool # max :: AttributeTarget -> AttributeTarget -> AttributeTarget # min :: AttributeTarget -> AttributeTarget -> AttributeTarget # | |
newtype AttributeList Source #
Constructors
| AttributeList | |
Fields
| |
Instances
| Read AttributeList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS AttributeList # readList :: ReadS [AttributeList] # | |
| Show AttributeList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> AttributeList -> ShowS # show :: AttributeList -> String # showList :: [AttributeList] -> ShowS # | |
| Eq AttributeList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: AttributeList -> AttributeList -> Bool # (/=) :: AttributeList -> AttributeList -> Bool # | |
| Ord AttributeList Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: AttributeList -> AttributeList -> Ordering # (<) :: AttributeList -> AttributeList -> Bool # (<=) :: AttributeList -> AttributeList -> Bool # (>) :: AttributeList -> AttributeList -> Bool # (>=) :: AttributeList -> AttributeList -> Bool # max :: AttributeList -> AttributeList -> AttributeList # min :: AttributeList -> AttributeList -> AttributeList # | |
Constructors
| Attribute | |
Instances
| Read Attribute Source # | |
| Show Attribute Source # | |
| Eq Attribute Source # | |
| Ord Attribute Source # | |
_Attribute :: Name Source #
newtype AttributeName Source #
Constructors
| AttributeName | |
Fields | |
Instances
| Read AttributeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS AttributeName # readList :: ReadS [AttributeName] # | |
| Show AttributeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> AttributeName -> ShowS # show :: AttributeName -> String # showList :: [AttributeName] -> ShowS # | |
| Eq AttributeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: AttributeName -> AttributeName -> Bool # (/=) :: AttributeName -> AttributeName -> Bool # | |
| Ord AttributeName Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: AttributeName -> AttributeName -> Ordering # (<) :: AttributeName -> AttributeName -> Bool # (<=) :: AttributeName -> AttributeName -> Bool # (>) :: AttributeName -> AttributeName -> Bool # (>=) :: AttributeName -> AttributeName -> Bool # max :: AttributeName -> AttributeName -> AttributeName # min :: AttributeName -> AttributeName -> AttributeName # | |
data AttributeArguments Source #
Constructors
| AttributeArguments | |
Instances
newtype PositionalArgumentList Source #
Constructors
| PositionalArgumentList | |
Fields | |
Instances
data PositionalArgument Source #
Constructors
| PositionalArgument | |
Instances
newtype NamedArgumentList Source #
Constructors
| NamedArgumentList | |
Fields | |
Instances
data NamedArgument Source #
Constructors
| NamedArgument | |
Instances
| Read NamedArgument Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS NamedArgument # readList :: ReadS [NamedArgument] # | |
| Show NamedArgument Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> NamedArgument -> ShowS # show :: NamedArgument -> String # showList :: [NamedArgument] -> ShowS # | |
| Eq NamedArgument Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: NamedArgument -> NamedArgument -> Bool # (/=) :: NamedArgument -> NamedArgument -> Bool # | |
| Ord NamedArgument Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: NamedArgument -> NamedArgument -> Ordering # (<) :: NamedArgument -> NamedArgument -> Bool # (<=) :: NamedArgument -> NamedArgument -> Bool # (>) :: NamedArgument -> NamedArgument -> Bool # (>=) :: NamedArgument -> NamedArgument -> Bool # max :: NamedArgument -> NamedArgument -> NamedArgument # min :: NamedArgument -> NamedArgument -> NamedArgument # | |
newtype AttributeArgumentExpression Source #
Constructors
| AttributeArgumentExpression | |
Instances
data PointerType Source #
Constructors
| PointerTypeValueType (Maybe ValueType) | |
| PointerTypePointerDepth Int |
Instances
| Read PointerType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS PointerType # readList :: ReadS [PointerType] # readPrec :: ReadPrec PointerType # readListPrec :: ReadPrec [PointerType] # | |
| Show PointerType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> PointerType -> ShowS # show :: PointerType -> String # showList :: [PointerType] -> ShowS # | |
| Eq PointerType Source # | |
Defined in Hydra.Ext.Csharp.Syntax | |
| Ord PointerType Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: PointerType -> PointerType -> Ordering # (<) :: PointerType -> PointerType -> Bool # (<=) :: PointerType -> PointerType -> Bool # (>) :: PointerType -> PointerType -> Bool # (>=) :: PointerType -> PointerType -> Bool # max :: PointerType -> PointerType -> PointerType # min :: PointerType -> PointerType -> PointerType # | |
_PointerType :: Name Source #
data PointerMemberAccess Source #
Constructors
| PointerMemberAccess | |
Instances
data PointerElementAccess Source #
Constructors
| PointerElementAccess | |
Instances
data FixedStatement Source #
Constructors
| FixedStatement | |
Instances
| Read FixedStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods readsPrec :: Int -> ReadS FixedStatement # readList :: ReadS [FixedStatement] # | |
| Show FixedStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods showsPrec :: Int -> FixedStatement -> ShowS # show :: FixedStatement -> String # showList :: [FixedStatement] -> ShowS # | |
| Eq FixedStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods (==) :: FixedStatement -> FixedStatement -> Bool # (/=) :: FixedStatement -> FixedStatement -> Bool # | |
| Ord FixedStatement Source # | |
Defined in Hydra.Ext.Csharp.Syntax Methods compare :: FixedStatement -> FixedStatement -> Ordering # (<) :: FixedStatement -> FixedStatement -> Bool # (<=) :: FixedStatement -> FixedStatement -> Bool # (>) :: FixedStatement -> FixedStatement -> Bool # (>=) :: FixedStatement -> FixedStatement -> Bool # max :: FixedStatement -> FixedStatement -> FixedStatement # min :: FixedStatement -> FixedStatement -> FixedStatement # | |
data FixedPointerDeclarator Source #
Constructors
| FixedPointerDeclaratorReference VariableReference | |
| FixedPointerDeclaratorExpression Expression |
Instances
data FixedSizeBufferDeclaration Source #
Constructors
| FixedSizeBufferDeclaration | |
Instances
data FixedSizeBufferModifier Source #
Constructors
| FixedSizeBufferModifierNew | |
| FixedSizeBufferModifierPublic | |
| FixedSizeBufferModifierInternal | |
| FixedSizeBufferModifierPrivate | |
| FixedSizeBufferModifierUnsafe |
Instances
data FixedSizeBufferDeclarator Source #
Constructors
| FixedSizeBufferDeclarator | |