Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Hydra.Ext.Shex.Syntax
Description
A Shex model. Based on the BNF at: | https://github.com/shexSpec/grammar/blob/master/bnf
Documentation
Constructors
ShexDoc | |
data ShexDoc_Sequence_Option Source #
Constructors
ShexDoc_Sequence_Option | |
Instances
data ShexDoc_Sequence_Option_Alts Source #
Constructors
ShexDoc_Sequence_Option_AltsNotStartAction NotStartAction | |
ShexDoc_Sequence_Option_AltsStartActions StartActions |
Instances
Constructors
DirectiveBaseDecl BaseDecl | |
DirectivePrefixDecl PrefixDecl |
Instances
Read Directive Source # | |
Show Directive Source # | |
Eq Directive Source # | |
Ord Directive Source # | |
_Directive :: Name Source #
Constructors
BaseDecl | |
Fields |
data PrefixDecl Source #
Constructors
PrefixDecl | |
Fields |
Instances
Read PrefixDecl Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS PrefixDecl # readList :: ReadS [PrefixDecl] # readPrec :: ReadPrec PrefixDecl # readListPrec :: ReadPrec [PrefixDecl] # | |
Show PrefixDecl Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> PrefixDecl -> ShowS # show :: PrefixDecl -> String # showList :: [PrefixDecl] -> ShowS # | |
Eq PrefixDecl Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord PrefixDecl Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: PrefixDecl -> PrefixDecl -> Ordering # (<) :: PrefixDecl -> PrefixDecl -> Bool # (<=) :: PrefixDecl -> PrefixDecl -> Bool # (>) :: PrefixDecl -> PrefixDecl -> Bool # (>=) :: PrefixDecl -> PrefixDecl -> Bool # max :: PrefixDecl -> PrefixDecl -> PrefixDecl # min :: PrefixDecl -> PrefixDecl -> PrefixDecl # |
_PrefixDecl :: Name Source #
data NotStartAction Source #
Constructors
NotStartActionStart NotStartAction_Start | |
NotStartActionShapeExprDecl NotStartAction_ShapeExprDecl |
Instances
Read NotStartAction Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NotStartAction # readList :: ReadS [NotStartAction] # | |
Show NotStartAction Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NotStartAction -> ShowS # show :: NotStartAction -> String # showList :: [NotStartAction] -> ShowS # | |
Eq NotStartAction Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: NotStartAction -> NotStartAction -> Bool # (/=) :: NotStartAction -> NotStartAction -> Bool # | |
Ord NotStartAction Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NotStartAction -> NotStartAction -> Ordering # (<) :: NotStartAction -> NotStartAction -> Bool # (<=) :: NotStartAction -> NotStartAction -> Bool # (>) :: NotStartAction -> NotStartAction -> Bool # (>=) :: NotStartAction -> NotStartAction -> Bool # max :: NotStartAction -> NotStartAction -> NotStartAction # min :: NotStartAction -> NotStartAction -> NotStartAction # |
data NotStartAction_Start Source #
Constructors
NotStartAction_Start | |
Instances
data NotStartAction_ShapeExprDecl Source #
Constructors
NotStartAction_ShapeExprDecl | |
Instances
data NotStartAction_ShapeExprDecl_Alts Source #
Constructors
NotStartAction_ShapeExprDecl_AltsShapeExpression ShapeExpression | |
NotStartAction_ShapeExprDecl_AltsEXTERNAL |
Instances
newtype StartActions Source #
Constructors
StartActions | |
Fields
|
Instances
Read StartActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS StartActions # readList :: ReadS [StartActions] # | |
Show StartActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> StartActions -> ShowS # show :: StartActions -> String # showList :: [StartActions] -> ShowS # | |
Eq StartActions Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord StartActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: StartActions -> StartActions -> Ordering # (<) :: StartActions -> StartActions -> Bool # (<=) :: StartActions -> StartActions -> Bool # (>) :: StartActions -> StartActions -> Bool # (>=) :: StartActions -> StartActions -> Bool # max :: StartActions -> StartActions -> StartActions # min :: StartActions -> StartActions -> StartActions # |
_StartActions :: Name Source #
Instances
Read Statement Source # | |
Show Statement Source # | |
Eq Statement Source # | |
Ord Statement Source # | |
_Statement :: Name Source #
newtype ShapeExpression Source #
Constructors
ShapeExpression | |
Fields |
Instances
Read ShapeExpression Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS ShapeExpression # readList :: ReadS [ShapeExpression] # | |
Show ShapeExpression Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> ShapeExpression -> ShowS # show :: ShapeExpression -> String # showList :: [ShapeExpression] -> ShowS # | |
Eq ShapeExpression Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: ShapeExpression -> ShapeExpression -> Bool # (/=) :: ShapeExpression -> ShapeExpression -> Bool # | |
Ord ShapeExpression Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: ShapeExpression -> ShapeExpression -> Ordering # (<) :: ShapeExpression -> ShapeExpression -> Bool # (<=) :: ShapeExpression -> ShapeExpression -> Bool # (>) :: ShapeExpression -> ShapeExpression -> Bool # (>=) :: ShapeExpression -> ShapeExpression -> Bool # max :: ShapeExpression -> ShapeExpression -> ShapeExpression # min :: ShapeExpression -> ShapeExpression -> ShapeExpression # |
newtype InlineShapeExpression Source #
Constructors
InlineShapeExpression | |
Fields |
Instances
Constructors
ShapeOr | |
data ShapeOr_ListOfSequence_Elmt Source #
Constructors
ShapeOr_ListOfSequence_Elmt | |
Instances
data InlineShapeOr Source #
Constructors
InlineShapeOr | |
Instances
Read InlineShapeOr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS InlineShapeOr # readList :: ReadS [InlineShapeOr] # | |
Show InlineShapeOr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> InlineShapeOr -> ShowS # show :: InlineShapeOr -> String # showList :: [InlineShapeOr] -> ShowS # | |
Eq InlineShapeOr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: InlineShapeOr -> InlineShapeOr -> Bool # (/=) :: InlineShapeOr -> InlineShapeOr -> Bool # | |
Ord InlineShapeOr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: InlineShapeOr -> InlineShapeOr -> Ordering # (<) :: InlineShapeOr -> InlineShapeOr -> Bool # (<=) :: InlineShapeOr -> InlineShapeOr -> Bool # (>) :: InlineShapeOr -> InlineShapeOr -> Bool # (>=) :: InlineShapeOr -> InlineShapeOr -> Bool # max :: InlineShapeOr -> InlineShapeOr -> InlineShapeOr # min :: InlineShapeOr -> InlineShapeOr -> InlineShapeOr # |
data InlineShapeOr_ListOfSequence_Elmt Source #
Constructors
InlineShapeOr_ListOfSequence_Elmt | |
Instances
Constructors
ShapeAnd | |
data ShapeAnd_ListOfSequence_Elmt Source #
Constructors
ShapeAnd_ListOfSequence_Elmt | |
Instances
data InlineShapeAnd Source #
Constructors
InlineShapeAnd | |
Instances
Read InlineShapeAnd Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS InlineShapeAnd # readList :: ReadS [InlineShapeAnd] # | |
Show InlineShapeAnd Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> InlineShapeAnd -> ShowS # show :: InlineShapeAnd -> String # showList :: [InlineShapeAnd] -> ShowS # | |
Eq InlineShapeAnd Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: InlineShapeAnd -> InlineShapeAnd -> Bool # (/=) :: InlineShapeAnd -> InlineShapeAnd -> Bool # | |
Ord InlineShapeAnd Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: InlineShapeAnd -> InlineShapeAnd -> Ordering # (<) :: InlineShapeAnd -> InlineShapeAnd -> Bool # (<=) :: InlineShapeAnd -> InlineShapeAnd -> Bool # (>) :: InlineShapeAnd -> InlineShapeAnd -> Bool # (>=) :: InlineShapeAnd -> InlineShapeAnd -> Bool # max :: InlineShapeAnd -> InlineShapeAnd -> InlineShapeAnd # min :: InlineShapeAnd -> InlineShapeAnd -> InlineShapeAnd # |
data InlineShapeAnd_ListOfSequence_Elmt Source #
Constructors
InlineShapeAnd_ListOfSequence_Elmt | |
Instances
Constructors
ShapeNot | |
Fields
|
data InlineShapeNot Source #
Constructors
InlineShapeNot | |
Fields |
Instances
Read InlineShapeNot Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS InlineShapeNot # readList :: ReadS [InlineShapeNot] # | |
Show InlineShapeNot Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> InlineShapeNot -> ShowS # show :: InlineShapeNot -> String # showList :: [InlineShapeNot] -> ShowS # | |
Eq InlineShapeNot Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: InlineShapeNot -> InlineShapeNot -> Bool # (/=) :: InlineShapeNot -> InlineShapeNot -> Bool # | |
Ord InlineShapeNot Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: InlineShapeNot -> InlineShapeNot -> Ordering # (<) :: InlineShapeNot -> InlineShapeNot -> Bool # (<=) :: InlineShapeNot -> InlineShapeNot -> Bool # (>) :: InlineShapeNot -> InlineShapeNot -> Bool # (>=) :: InlineShapeNot -> InlineShapeNot -> Bool # max :: InlineShapeNot -> InlineShapeNot -> InlineShapeNot # min :: InlineShapeNot -> InlineShapeNot -> InlineShapeNot # |
Constructors
ShapeAtomSequence ShapeAtom_Sequence | |
ShapeAtomShapeOrRef ShapeOrRef | |
ShapeAtomSequence2 ShapeAtom_Sequence2 | |
ShapeAtomPeriod |
Instances
Read ShapeAtom Source # | |
Show ShapeAtom Source # | |
Eq ShapeAtom Source # | |
Ord ShapeAtom Source # | |
_ShapeAtom :: Name Source #
data ShapeAtom_Sequence Source #
Constructors
ShapeAtom_Sequence | |
Instances
data ShapeAtom_Sequence2 Source #
Constructors
ShapeAtom_Sequence2 | |
Instances
data InlineShapeAtom Source #
Constructors
InlineShapeAtomSequence InlineShapeAtom_Sequence | |
InlineShapeAtomSequence2 InlineShapeAtom_Sequence2 | |
InlineShapeAtomSequence3 InlineShapeAtom_Sequence3 | |
InlineShapeAtomPeriod |
Instances
Read InlineShapeAtom Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS InlineShapeAtom # readList :: ReadS [InlineShapeAtom] # | |
Show InlineShapeAtom Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> InlineShapeAtom -> ShowS # show :: InlineShapeAtom -> String # showList :: [InlineShapeAtom] -> ShowS # | |
Eq InlineShapeAtom Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: InlineShapeAtom -> InlineShapeAtom -> Bool # (/=) :: InlineShapeAtom -> InlineShapeAtom -> Bool # | |
Ord InlineShapeAtom Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: InlineShapeAtom -> InlineShapeAtom -> Ordering # (<) :: InlineShapeAtom -> InlineShapeAtom -> Bool # (<=) :: InlineShapeAtom -> InlineShapeAtom -> Bool # (>) :: InlineShapeAtom -> InlineShapeAtom -> Bool # (>=) :: InlineShapeAtom -> InlineShapeAtom -> Bool # max :: InlineShapeAtom -> InlineShapeAtom -> InlineShapeAtom # min :: InlineShapeAtom -> InlineShapeAtom -> InlineShapeAtom # |
data InlineShapeAtom_Sequence Source #
Constructors
InlineShapeAtom_Sequence | |
Instances
data InlineShapeAtom_Sequence2 Source #
Constructors
InlineShapeAtom_Sequence2 | |
Instances
data InlineShapeAtom_Sequence3 Source #
Constructors
InlineShapeAtom_Sequence3 | |
Instances
data ShapeOrRef Source #
Constructors
ShapeOrRefShapeDefinition ShapeDefinition | |
ShapeOrRefAtpNameLn AtpNameLn | |
ShapeOrRefAtpNameNs AtpNameNs | |
ShapeOrRefSequence ShapeOrRef_Sequence |
Instances
Read ShapeOrRef Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS ShapeOrRef # readList :: ReadS [ShapeOrRef] # readPrec :: ReadPrec ShapeOrRef # readListPrec :: ReadPrec [ShapeOrRef] # | |
Show ShapeOrRef Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> ShapeOrRef -> ShowS # show :: ShapeOrRef -> String # showList :: [ShapeOrRef] -> ShowS # | |
Eq ShapeOrRef Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord ShapeOrRef Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: ShapeOrRef -> ShapeOrRef -> Ordering # (<) :: ShapeOrRef -> ShapeOrRef -> Bool # (<=) :: ShapeOrRef -> ShapeOrRef -> Bool # (>) :: ShapeOrRef -> ShapeOrRef -> Bool # (>=) :: ShapeOrRef -> ShapeOrRef -> Bool # max :: ShapeOrRef -> ShapeOrRef -> ShapeOrRef # min :: ShapeOrRef -> ShapeOrRef -> ShapeOrRef # |
_ShapeOrRef :: Name Source #
data ShapeOrRef_Sequence Source #
Constructors
ShapeOrRef_Sequence | |
Instances
data InlineShapeOrRef Source #
Constructors
InlineShapeOrRefInlineShapeDefinition InlineShapeDefinition | |
InlineShapeOrRefAtpNameLn AtpNameLn | |
InlineShapeOrRefAtpNameNs AtpNameNs | |
InlineShapeOrRefSequence InlineShapeOrRef_Sequence |
Instances
data InlineShapeOrRef_Sequence Source #
Constructors
InlineShapeOrRef_Sequence | |
Instances
data NodeConstraint Source #
Constructors
Instances
Read NodeConstraint Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NodeConstraint # readList :: ReadS [NodeConstraint] # | |
Show NodeConstraint Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NodeConstraint -> ShowS # show :: NodeConstraint -> String # showList :: [NodeConstraint] -> ShowS # | |
Eq NodeConstraint Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: NodeConstraint -> NodeConstraint -> Bool # (/=) :: NodeConstraint -> NodeConstraint -> Bool # | |
Ord NodeConstraint Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NodeConstraint -> NodeConstraint -> Ordering # (<) :: NodeConstraint -> NodeConstraint -> Bool # (<=) :: NodeConstraint -> NodeConstraint -> Bool # (>) :: NodeConstraint -> NodeConstraint -> Bool # (>=) :: NodeConstraint -> NodeConstraint -> Bool # max :: NodeConstraint -> NodeConstraint -> NodeConstraint # min :: NodeConstraint -> NodeConstraint -> NodeConstraint # |
data NodeConstraint_Sequence Source #
Constructors
NodeConstraint_Sequence | |
Fields |
Instances
data NodeConstraint_Sequence2 Source #
Constructors
NodeConstraint_Sequence2 | |
Instances
data NodeConstraint_Sequence3 Source #
Constructors
NodeConstraint_Sequence3 | |
Instances
data NodeConstraint_Sequence4 Source #
Constructors
NodeConstraint_Sequence4 | |
Instances
data NodeConstraint_Sequence5 Source #
Constructors
NodeConstraint_Sequence5 | |
Instances
data NonLiteralKind Source #
Instances
Read NonLiteralKind Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NonLiteralKind # readList :: ReadS [NonLiteralKind] # | |
Show NonLiteralKind Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NonLiteralKind -> ShowS # show :: NonLiteralKind -> String # showList :: [NonLiteralKind] -> ShowS # | |
Eq NonLiteralKind Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: NonLiteralKind -> NonLiteralKind -> Bool # (/=) :: NonLiteralKind -> NonLiteralKind -> Bool # | |
Ord NonLiteralKind Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NonLiteralKind -> NonLiteralKind -> Ordering # (<) :: NonLiteralKind -> NonLiteralKind -> Bool # (<=) :: NonLiteralKind -> NonLiteralKind -> Bool # (>) :: NonLiteralKind -> NonLiteralKind -> Bool # (>=) :: NonLiteralKind -> NonLiteralKind -> Bool # max :: NonLiteralKind -> NonLiteralKind -> NonLiteralKind # min :: NonLiteralKind -> NonLiteralKind -> NonLiteralKind # |
Constructors
XsFacetStringFacet StringFacet | |
XsFacetNumericFacet NumericFacet |
data StringFacet Source #
Instances
Read StringFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS StringFacet # readList :: ReadS [StringFacet] # readPrec :: ReadPrec StringFacet # readListPrec :: ReadPrec [StringFacet] # | |
Show StringFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> StringFacet -> ShowS # show :: StringFacet -> String # showList :: [StringFacet] -> ShowS # | |
Eq StringFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord StringFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: StringFacet -> StringFacet -> Ordering # (<) :: StringFacet -> StringFacet -> Bool # (<=) :: StringFacet -> StringFacet -> Bool # (>) :: StringFacet -> StringFacet -> Bool # (>=) :: StringFacet -> StringFacet -> Bool # max :: StringFacet -> StringFacet -> StringFacet # min :: StringFacet -> StringFacet -> StringFacet # |
_StringFacet :: Name Source #
data StringFacet_Sequence Source #
Constructors
StringFacet_Sequence | |
Instances
data StringLength Source #
Instances
Read StringLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS StringLength # readList :: ReadS [StringLength] # | |
Show StringLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> StringLength -> ShowS # show :: StringLength -> String # showList :: [StringLength] -> ShowS # | |
Eq StringLength Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord StringLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: StringLength -> StringLength -> Ordering # (<) :: StringLength -> StringLength -> Bool # (<=) :: StringLength -> StringLength -> Bool # (>) :: StringLength -> StringLength -> Bool # (>=) :: StringLength -> StringLength -> Bool # max :: StringLength -> StringLength -> StringLength # min :: StringLength -> StringLength -> StringLength # |
_StringLength :: Name Source #
data NumericFacet Source #
Instances
Read NumericFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NumericFacet # readList :: ReadS [NumericFacet] # | |
Show NumericFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NumericFacet -> ShowS # show :: NumericFacet -> String # showList :: [NumericFacet] -> ShowS # | |
Eq NumericFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord NumericFacet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NumericFacet -> NumericFacet -> Ordering # (<) :: NumericFacet -> NumericFacet -> Bool # (<=) :: NumericFacet -> NumericFacet -> Bool # (>) :: NumericFacet -> NumericFacet -> Bool # (>=) :: NumericFacet -> NumericFacet -> Bool # max :: NumericFacet -> NumericFacet -> NumericFacet # min :: NumericFacet -> NumericFacet -> NumericFacet # |
_NumericFacet :: Name Source #
data NumericFacet_Sequence Source #
Constructors
NumericFacet_Sequence | |
Instances
data NumericFacet_Sequence2 Source #
Constructors
NumericFacet_Sequence2 | |
Instances
data NumericRange Source #
Constructors
NumericRangeMININCLUSIVE | |
NumericRangeMINEXCLUSIVE | |
NumericRangeMAXINCLUSIVE | |
NumericRangeMAXEXCLUSIVE |
Instances
Read NumericRange Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NumericRange # readList :: ReadS [NumericRange] # | |
Show NumericRange Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NumericRange -> ShowS # show :: NumericRange -> String # showList :: [NumericRange] -> ShowS # | |
Eq NumericRange Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord NumericRange Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NumericRange -> NumericRange -> Ordering # (<) :: NumericRange -> NumericRange -> Bool # (<=) :: NumericRange -> NumericRange -> Bool # (>) :: NumericRange -> NumericRange -> Bool # (>=) :: NumericRange -> NumericRange -> Bool # max :: NumericRange -> NumericRange -> NumericRange # min :: NumericRange -> NumericRange -> NumericRange # |
_NumericRange :: Name Source #
data NumericLength Source #
Constructors
NumericLengthTOTALDIGITS | |
NumericLengthFRACTIONDIGITS |
Instances
Read NumericLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NumericLength # readList :: ReadS [NumericLength] # | |
Show NumericLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NumericLength -> ShowS # show :: NumericLength -> String # showList :: [NumericLength] -> ShowS # | |
Eq NumericLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: NumericLength -> NumericLength -> Bool # (/=) :: NumericLength -> NumericLength -> Bool # | |
Ord NumericLength Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NumericLength -> NumericLength -> Ordering # (<) :: NumericLength -> NumericLength -> Bool # (<=) :: NumericLength -> NumericLength -> Bool # (>) :: NumericLength -> NumericLength -> Bool # (>=) :: NumericLength -> NumericLength -> Bool # max :: NumericLength -> NumericLength -> NumericLength # min :: NumericLength -> NumericLength -> NumericLength # |
data ShapeDefinition Source #
Constructors
ShapeDefinition | |
Instances
Read ShapeDefinition Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS ShapeDefinition # readList :: ReadS [ShapeDefinition] # | |
Show ShapeDefinition Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> ShapeDefinition -> ShowS # show :: ShapeDefinition -> String # showList :: [ShapeDefinition] -> ShowS # | |
Eq ShapeDefinition Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: ShapeDefinition -> ShapeDefinition -> Bool # (/=) :: ShapeDefinition -> ShapeDefinition -> Bool # | |
Ord ShapeDefinition Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: ShapeDefinition -> ShapeDefinition -> Ordering # (<) :: ShapeDefinition -> ShapeDefinition -> Bool # (<=) :: ShapeDefinition -> ShapeDefinition -> Bool # (>) :: ShapeDefinition -> ShapeDefinition -> Bool # (>=) :: ShapeDefinition -> ShapeDefinition -> Bool # max :: ShapeDefinition -> ShapeDefinition -> ShapeDefinition # min :: ShapeDefinition -> ShapeDefinition -> ShapeDefinition # |
data ShapeDefinition_ListOfAlts_Elmt Source #
Constructors
ShapeDefinition_ListOfAlts_ElmtIncludeSet IncludeSet | |
ShapeDefinition_ListOfAlts_ElmtExtraPropertySet ExtraPropertySet | |
ShapeDefinition_ListOfAlts_ElmtCLOSED |
Instances
data InlineShapeDefinition Source #
Constructors
InlineShapeDefinition | |
Instances
data InlineShapeDefinition_ListOfAlts_Elmt Source #
Constructors
InlineShapeDefinition_ListOfAlts_ElmtIncludeSet IncludeSet | |
InlineShapeDefinition_ListOfAlts_ElmtExtraPropertySet ExtraPropertySet | |
InlineShapeDefinition_ListOfAlts_ElmtCLOSED |
Instances
data ExtraPropertySet Source #
Constructors
ExtraPropertySet | |
Fields |
Instances
newtype TripleExpression Source #
Constructors
TripleExpression | |
Fields |
Instances
data OneOfTripleExpr Source #
Constructors
OneOfTripleExprGroupTripleExpr GroupTripleExpr | |
OneOfTripleExprMultiElementOneOf MultiElementOneOf |
Instances
Read OneOfTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS OneOfTripleExpr # readList :: ReadS [OneOfTripleExpr] # | |
Show OneOfTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> OneOfTripleExpr -> ShowS # show :: OneOfTripleExpr -> String # showList :: [OneOfTripleExpr] -> ShowS # | |
Eq OneOfTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: OneOfTripleExpr -> OneOfTripleExpr -> Bool # (/=) :: OneOfTripleExpr -> OneOfTripleExpr -> Bool # | |
Ord OneOfTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: OneOfTripleExpr -> OneOfTripleExpr -> Ordering # (<) :: OneOfTripleExpr -> OneOfTripleExpr -> Bool # (<=) :: OneOfTripleExpr -> OneOfTripleExpr -> Bool # (>) :: OneOfTripleExpr -> OneOfTripleExpr -> Bool # (>=) :: OneOfTripleExpr -> OneOfTripleExpr -> Bool # max :: OneOfTripleExpr -> OneOfTripleExpr -> OneOfTripleExpr # min :: OneOfTripleExpr -> OneOfTripleExpr -> OneOfTripleExpr # |
data MultiElementOneOf Source #
Constructors
MultiElementOneOf | |
Instances
data MultiElementOneOf_ListOfSequence_Elmt Source #
Constructors
MultiElementOneOf_ListOfSequence_Elmt | |
Instances
data InnerTripleExpr Source #
Constructors
InnerTripleExprMultiElementGroup MultiElementGroup | |
InnerTripleExprMultiElementOneOf MultiElementOneOf |
Instances
Read InnerTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS InnerTripleExpr # readList :: ReadS [InnerTripleExpr] # | |
Show InnerTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> InnerTripleExpr -> ShowS # show :: InnerTripleExpr -> String # showList :: [InnerTripleExpr] -> ShowS # | |
Eq InnerTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: InnerTripleExpr -> InnerTripleExpr -> Bool # (/=) :: InnerTripleExpr -> InnerTripleExpr -> Bool # | |
Ord InnerTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: InnerTripleExpr -> InnerTripleExpr -> Ordering # (<) :: InnerTripleExpr -> InnerTripleExpr -> Bool # (<=) :: InnerTripleExpr -> InnerTripleExpr -> Bool # (>) :: InnerTripleExpr -> InnerTripleExpr -> Bool # (>=) :: InnerTripleExpr -> InnerTripleExpr -> Bool # max :: InnerTripleExpr -> InnerTripleExpr -> InnerTripleExpr # min :: InnerTripleExpr -> InnerTripleExpr -> InnerTripleExpr # |
data GroupTripleExpr Source #
Constructors
GroupTripleExprSingleElementGroup SingleElementGroup | |
GroupTripleExprMultiElementGroup MultiElementGroup |
Instances
Read GroupTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS GroupTripleExpr # readList :: ReadS [GroupTripleExpr] # | |
Show GroupTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> GroupTripleExpr -> ShowS # show :: GroupTripleExpr -> String # showList :: [GroupTripleExpr] -> ShowS # | |
Eq GroupTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: GroupTripleExpr -> GroupTripleExpr -> Bool # (/=) :: GroupTripleExpr -> GroupTripleExpr -> Bool # | |
Ord GroupTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: GroupTripleExpr -> GroupTripleExpr -> Ordering # (<) :: GroupTripleExpr -> GroupTripleExpr -> Bool # (<=) :: GroupTripleExpr -> GroupTripleExpr -> Bool # (>) :: GroupTripleExpr -> GroupTripleExpr -> Bool # (>=) :: GroupTripleExpr -> GroupTripleExpr -> Bool # max :: GroupTripleExpr -> GroupTripleExpr -> GroupTripleExpr # min :: GroupTripleExpr -> GroupTripleExpr -> GroupTripleExpr # |
data SingleElementGroup Source #
Constructors
SingleElementGroup | |
Instances
data MultiElementGroup Source #
Constructors
MultiElementGroup | |
Instances
data MultiElementGroup_ListOfSequence_Elmt Source #
Constructors
MultiElementGroup_ListOfSequence_Elmt | |
Instances
data UnaryTripleExpr Source #
Instances
Read UnaryTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS UnaryTripleExpr # readList :: ReadS [UnaryTripleExpr] # | |
Show UnaryTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> UnaryTripleExpr -> ShowS # show :: UnaryTripleExpr -> String # showList :: [UnaryTripleExpr] -> ShowS # | |
Eq UnaryTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: UnaryTripleExpr -> UnaryTripleExpr -> Bool # (/=) :: UnaryTripleExpr -> UnaryTripleExpr -> Bool # | |
Ord UnaryTripleExpr Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: UnaryTripleExpr -> UnaryTripleExpr -> Ordering # (<) :: UnaryTripleExpr -> UnaryTripleExpr -> Bool # (<=) :: UnaryTripleExpr -> UnaryTripleExpr -> Bool # (>) :: UnaryTripleExpr -> UnaryTripleExpr -> Bool # (>=) :: UnaryTripleExpr -> UnaryTripleExpr -> Bool # max :: UnaryTripleExpr -> UnaryTripleExpr -> UnaryTripleExpr # min :: UnaryTripleExpr -> UnaryTripleExpr -> UnaryTripleExpr # |
data UnaryTripleExpr_Sequence Source #
Constructors
UnaryTripleExpr_Sequence | |
Instances
data UnaryTripleExpr_Sequence_Sequence_Option Source #
Constructors
UnaryTripleExpr_Sequence_Sequence_Option | |
Instances
data UnaryTripleExpr_Sequence_Alts Source #
Constructors
UnaryTripleExpr_Sequence_AltsTripleConstraint TripleConstraint | |
UnaryTripleExpr_Sequence_AltsBracketedTripleExpr BracketedTripleExpr |
Instances
data BracketedTripleExpr Source #
Constructors
BracketedTripleExpr | |
Instances
data TripleConstraint Source #
Constructors
TripleConstraint | |
Fields |
Instances
data Cardinality Source #
Instances
Read Cardinality Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS Cardinality # readList :: ReadS [Cardinality] # readPrec :: ReadPrec Cardinality # readListPrec :: ReadPrec [Cardinality] # | |
Show Cardinality Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> Cardinality -> ShowS # show :: Cardinality -> String # showList :: [Cardinality] -> ShowS # | |
Eq Cardinality Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord Cardinality Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: Cardinality -> Cardinality -> Ordering # (<) :: Cardinality -> Cardinality -> Bool # (<=) :: Cardinality -> Cardinality -> Bool # (>) :: Cardinality -> Cardinality -> Bool # (>=) :: Cardinality -> Cardinality -> Bool # max :: Cardinality -> Cardinality -> Cardinality # min :: Cardinality -> Cardinality -> Cardinality # |
_Cardinality :: Name Source #
data SenseFlags Source #
Constructors
SenseFlags | |
Instances
Read SenseFlags Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS SenseFlags # readList :: ReadS [SenseFlags] # readPrec :: ReadPrec SenseFlags # readListPrec :: ReadPrec [SenseFlags] # | |
Show SenseFlags Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> SenseFlags -> ShowS # show :: SenseFlags -> String # showList :: [SenseFlags] -> ShowS # | |
Eq SenseFlags Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord SenseFlags Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: SenseFlags -> SenseFlags -> Ordering # (<) :: SenseFlags -> SenseFlags -> Bool # (<=) :: SenseFlags -> SenseFlags -> Bool # (>) :: SenseFlags -> SenseFlags -> Bool # (>=) :: SenseFlags -> SenseFlags -> Bool # max :: SenseFlags -> SenseFlags -> SenseFlags # min :: SenseFlags -> SenseFlags -> SenseFlags # |
_SenseFlags :: Name Source #
Constructors
ValueSet | |
Fields |
data ValueSetValue Source #
Constructors
ValueSetValueIriRange IriRange | |
ValueSetValueLiteral Literal |
Instances
Read ValueSetValue Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS ValueSetValue # readList :: ReadS [ValueSetValue] # | |
Show ValueSetValue Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> ValueSetValue -> ShowS # show :: ValueSetValue -> String # showList :: [ValueSetValue] -> ShowS # | |
Eq ValueSetValue Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: ValueSetValue -> ValueSetValue -> Bool # (/=) :: ValueSetValue -> ValueSetValue -> Bool # | |
Ord ValueSetValue Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: ValueSetValue -> ValueSetValue -> Ordering # (<) :: ValueSetValue -> ValueSetValue -> Bool # (<=) :: ValueSetValue -> ValueSetValue -> Bool # (>) :: ValueSetValue -> ValueSetValue -> Bool # (>=) :: ValueSetValue -> ValueSetValue -> Bool # max :: ValueSetValue -> ValueSetValue -> ValueSetValue # min :: ValueSetValue -> ValueSetValue -> ValueSetValue # |
data IriRange_Sequence Source #
Constructors
IriRange_Sequence | |
Instances
data IriRange_Sequence_Sequence_Option Source #
Constructors
IriRange_Sequence_Sequence_Option | |
Instances
data IriRange_Sequence2 Source #
Constructors
IriRange_Sequence2 | |
Fields |
Instances
Constructors
Exclusion | |
Fields
|
Instances
Read Exclusion Source # | |
Show Exclusion Source # | |
Eq Exclusion Source # | |
Ord Exclusion Source # | |
_Exclusion :: Name Source #
Constructors
Include | |
Fields |
data Annotation Source #
Constructors
Annotation | |
Fields |
Instances
Read Annotation Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS Annotation # readList :: ReadS [Annotation] # readPrec :: ReadPrec Annotation # readListPrec :: ReadPrec [Annotation] # | |
Show Annotation Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> Annotation -> ShowS # show :: Annotation -> String # showList :: [Annotation] -> ShowS # | |
Eq Annotation Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord Annotation Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: Annotation -> Annotation -> Ordering # (<) :: Annotation -> Annotation -> Bool # (<=) :: Annotation -> Annotation -> Bool # (>) :: Annotation -> Annotation -> Bool # (>=) :: Annotation -> Annotation -> Bool # max :: Annotation -> Annotation -> Annotation # min :: Annotation -> Annotation -> Annotation # |
_Annotation :: Name Source #
data Annotation_Alts Source #
Constructors
Annotation_AltsIri Iri | |
Annotation_AltsLiteral Literal |
Instances
Read Annotation_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS Annotation_Alts # readList :: ReadS [Annotation_Alts] # | |
Show Annotation_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> Annotation_Alts -> ShowS # show :: Annotation_Alts -> String # showList :: [Annotation_Alts] -> ShowS # | |
Eq Annotation_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: Annotation_Alts -> Annotation_Alts -> Bool # (/=) :: Annotation_Alts -> Annotation_Alts -> Bool # | |
Ord Annotation_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: Annotation_Alts -> Annotation_Alts -> Ordering # (<) :: Annotation_Alts -> Annotation_Alts -> Bool # (<=) :: Annotation_Alts -> Annotation_Alts -> Bool # (>) :: Annotation_Alts -> Annotation_Alts -> Bool # (>=) :: Annotation_Alts -> Annotation_Alts -> Bool # max :: Annotation_Alts -> Annotation_Alts -> Annotation_Alts # min :: Annotation_Alts -> Annotation_Alts -> Annotation_Alts # |
newtype SemanticActions Source #
Constructors
SemanticActions | |
Fields |
Instances
Read SemanticActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS SemanticActions # readList :: ReadS [SemanticActions] # | |
Show SemanticActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> SemanticActions -> ShowS # show :: SemanticActions -> String # showList :: [SemanticActions] -> ShowS # | |
Eq SemanticActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: SemanticActions -> SemanticActions -> Bool # (/=) :: SemanticActions -> SemanticActions -> Bool # | |
Ord SemanticActions Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: SemanticActions -> SemanticActions -> Ordering # (<) :: SemanticActions -> SemanticActions -> Bool # (<=) :: SemanticActions -> SemanticActions -> Bool # (>) :: SemanticActions -> SemanticActions -> Bool # (>=) :: SemanticActions -> SemanticActions -> Bool # max :: SemanticActions -> SemanticActions -> SemanticActions # min :: SemanticActions -> SemanticActions -> SemanticActions # |
Constructors
CodeDecl | |
Fields |
data CodeDecl_Alts Source #
Constructors
CodeDecl_AltsCode Code | |
CodeDecl_AltsPercnt |
Instances
Read CodeDecl_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS CodeDecl_Alts # readList :: ReadS [CodeDecl_Alts] # | |
Show CodeDecl_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> CodeDecl_Alts -> ShowS # show :: CodeDecl_Alts -> String # showList :: [CodeDecl_Alts] -> ShowS # | |
Eq CodeDecl_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: CodeDecl_Alts -> CodeDecl_Alts -> Bool # (/=) :: CodeDecl_Alts -> CodeDecl_Alts -> Bool # | |
Ord CodeDecl_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: CodeDecl_Alts -> CodeDecl_Alts -> Ordering # (<) :: CodeDecl_Alts -> CodeDecl_Alts -> Bool # (<=) :: CodeDecl_Alts -> CodeDecl_Alts -> Bool # (>) :: CodeDecl_Alts -> CodeDecl_Alts -> Bool # (>=) :: CodeDecl_Alts -> CodeDecl_Alts -> Bool # max :: CodeDecl_Alts -> CodeDecl_Alts -> CodeDecl_Alts # min :: CodeDecl_Alts -> CodeDecl_Alts -> CodeDecl_Alts # |
Constructors
LiteralRdfLiteral RdfLiteral | |
LiteralNumericLiteral NumericLiteral | |
LiteralBooleanLiteral BooleanLiteral |
Constructors
PredicateIri Iri | |
PredicateRdfType RdfType |
Instances
Read Predicate Source # | |
Show Predicate Source # | |
Eq Predicate Source # | |
Ord Predicate Source # | |
_Predicate :: Name Source #
Constructors
Datatype | |
Fields
|
data ShapeExprLabel Source #
Constructors
ShapeExprLabelIri Iri | |
ShapeExprLabelBlankNode BlankNode |
Instances
Read ShapeExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS ShapeExprLabel # readList :: ReadS [ShapeExprLabel] # | |
Show ShapeExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> ShapeExprLabel -> ShowS # show :: ShapeExprLabel -> String # showList :: [ShapeExprLabel] -> ShowS # | |
Eq ShapeExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: ShapeExprLabel -> ShapeExprLabel -> Bool # (/=) :: ShapeExprLabel -> ShapeExprLabel -> Bool # | |
Ord ShapeExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: ShapeExprLabel -> ShapeExprLabel -> Ordering # (<) :: ShapeExprLabel -> ShapeExprLabel -> Bool # (<=) :: ShapeExprLabel -> ShapeExprLabel -> Bool # (>) :: ShapeExprLabel -> ShapeExprLabel -> Bool # (>=) :: ShapeExprLabel -> ShapeExprLabel -> Bool # max :: ShapeExprLabel -> ShapeExprLabel -> ShapeExprLabel # min :: ShapeExprLabel -> ShapeExprLabel -> ShapeExprLabel # |
data TripleExprLabel Source #
Constructors
TripleExprLabel | |
Fields |
Instances
Read TripleExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS TripleExprLabel # readList :: ReadS [TripleExprLabel] # | |
Show TripleExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> TripleExprLabel -> ShowS # show :: TripleExprLabel -> String # showList :: [TripleExprLabel] -> ShowS # | |
Eq TripleExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: TripleExprLabel -> TripleExprLabel -> Bool # (/=) :: TripleExprLabel -> TripleExprLabel -> Bool # | |
Ord TripleExprLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: TripleExprLabel -> TripleExprLabel -> Ordering # (<) :: TripleExprLabel -> TripleExprLabel -> Bool # (<=) :: TripleExprLabel -> TripleExprLabel -> Bool # (>) :: TripleExprLabel -> TripleExprLabel -> Bool # (>=) :: TripleExprLabel -> TripleExprLabel -> Bool # max :: TripleExprLabel -> TripleExprLabel -> TripleExprLabel # min :: TripleExprLabel -> TripleExprLabel -> TripleExprLabel # |
data TripleExprLabel_Alts Source #
Instances
data NumericLiteral Source #
Constructors
NumericLiteralInteger Integer_ | |
NumericLiteralDecimal Decimal | |
NumericLiteralDouble Double_ |
Instances
Read NumericLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS NumericLiteral # readList :: ReadS [NumericLiteral] # | |
Show NumericLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> NumericLiteral -> ShowS # show :: NumericLiteral -> String # showList :: [NumericLiteral] -> ShowS # | |
Eq NumericLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: NumericLiteral -> NumericLiteral -> Bool # (/=) :: NumericLiteral -> NumericLiteral -> Bool # | |
Ord NumericLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: NumericLiteral -> NumericLiteral -> Ordering # (<) :: NumericLiteral -> NumericLiteral -> Bool # (<=) :: NumericLiteral -> NumericLiteral -> Bool # (>) :: NumericLiteral -> NumericLiteral -> Bool # (>=) :: NumericLiteral -> NumericLiteral -> Bool # max :: NumericLiteral -> NumericLiteral -> NumericLiteral # min :: NumericLiteral -> NumericLiteral -> NumericLiteral # |
data RdfLiteral Source #
Constructors
RdfLiteral | |
Fields |
Instances
Read RdfLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS RdfLiteral # readList :: ReadS [RdfLiteral] # readPrec :: ReadPrec RdfLiteral # readListPrec :: ReadPrec [RdfLiteral] # | |
Show RdfLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> RdfLiteral -> ShowS # show :: RdfLiteral -> String # showList :: [RdfLiteral] -> ShowS # | |
Eq RdfLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord RdfLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: RdfLiteral -> RdfLiteral -> Ordering # (<) :: RdfLiteral -> RdfLiteral -> Bool # (<=) :: RdfLiteral -> RdfLiteral -> Bool # (>) :: RdfLiteral -> RdfLiteral -> Bool # (>=) :: RdfLiteral -> RdfLiteral -> Bool # max :: RdfLiteral -> RdfLiteral -> RdfLiteral # min :: RdfLiteral -> RdfLiteral -> RdfLiteral # |
_RdfLiteral :: Name Source #
data RdfLiteral_Alts_Option Source #
Constructors
RdfLiteral_Alts_OptionLangTag LangTag | |
RdfLiteral_Alts_OptionSequence RdfLiteral_Alts_Option_Sequence |
Instances
data RdfLiteral_Alts_Option_Sequence Source #
Constructors
RdfLiteral_Alts_Option_Sequence | |
Instances
data BooleanLiteral Source #
Constructors
BooleanLiteralTrue | |
BooleanLiteralFalse |
Instances
Read BooleanLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS BooleanLiteral # readList :: ReadS [BooleanLiteral] # | |
Show BooleanLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> BooleanLiteral -> ShowS # show :: BooleanLiteral -> String # showList :: [BooleanLiteral] -> ShowS # | |
Eq BooleanLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: BooleanLiteral -> BooleanLiteral -> Bool # (/=) :: BooleanLiteral -> BooleanLiteral -> Bool # | |
Ord BooleanLiteral Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: BooleanLiteral -> BooleanLiteral -> Ordering # (<) :: BooleanLiteral -> BooleanLiteral -> Bool # (<=) :: BooleanLiteral -> BooleanLiteral -> Bool # (>) :: BooleanLiteral -> BooleanLiteral -> Bool # (>=) :: BooleanLiteral -> BooleanLiteral -> Bool # max :: BooleanLiteral -> BooleanLiteral -> BooleanLiteral # min :: BooleanLiteral -> BooleanLiteral -> BooleanLiteral # |
Constructors
StringStringLiteral1 StringLiteral1 | |
StringStringLiteralLong1 StringLiteralLong1 | |
StringStringLiteral2 StringLiteral2 | |
StringStringLiteralLong2 StringLiteralLong2 |
Constructors
IriIriRef IriRef | |
IriPrefixedName PrefixedName |
data PrefixedName Source #
Constructors
PrefixedNamePnameLn PnameLn | |
PrefixedNamePnameNs PnameNs |
Instances
Read PrefixedName Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS PrefixedName # readList :: ReadS [PrefixedName] # | |
Show PrefixedName Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> PrefixedName -> ShowS # show :: PrefixedName -> String # showList :: [PrefixedName] -> ShowS # | |
Eq PrefixedName Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord PrefixedName Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: PrefixedName -> PrefixedName -> Ordering # (<) :: PrefixedName -> PrefixedName -> Bool # (<=) :: PrefixedName -> PrefixedName -> Bool # (>) :: PrefixedName -> PrefixedName -> Bool # (>=) :: PrefixedName -> PrefixedName -> Bool # max :: PrefixedName -> PrefixedName -> PrefixedName # min :: PrefixedName -> PrefixedName -> PrefixedName # |
_PrefixedName :: Name Source #
Constructors
BlankNode | |
Fields |
Instances
Read BlankNode Source # | |
Show BlankNode Source # | |
Eq BlankNode Source # | |
Ord BlankNode Source # | |
_BlankNode :: Name Source #
data IncludeSet Source #
Constructors
IncludeSet | |
Fields |
Instances
Read IncludeSet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS IncludeSet # readList :: ReadS [IncludeSet] # readPrec :: ReadPrec IncludeSet # readListPrec :: ReadPrec [IncludeSet] # | |
Show IncludeSet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> IncludeSet -> ShowS # show :: IncludeSet -> String # showList :: [IncludeSet] -> ShowS # | |
Eq IncludeSet Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord IncludeSet Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: IncludeSet -> IncludeSet -> Ordering # (<) :: IncludeSet -> IncludeSet -> Bool # (<=) :: IncludeSet -> IncludeSet -> Bool # (>) :: IncludeSet -> IncludeSet -> Bool # (>=) :: IncludeSet -> IncludeSet -> Bool # max :: IncludeSet -> IncludeSet -> IncludeSet # min :: IncludeSet -> IncludeSet -> IncludeSet # |
_IncludeSet :: Name Source #
Constructors
Code | |
Fields |
data Code_ListOfAlts_Elmt Source #
Constructors
Code_ListOfAlts_ElmtRegex String | |
Code_ListOfAlts_ElmtSequence Code_ListOfAlts_Elmt_Sequence | |
Code_ListOfAlts_ElmtUchar Uchar |
Instances
data Code_ListOfAlts_Elmt_Sequence Source #
Constructors
Code_ListOfAlts_Elmt_Sequence | |
Fields |
Instances
data RepeatRange Source #
Constructors
RepeatRange | |
Instances
Read RepeatRange Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS RepeatRange # readList :: ReadS [RepeatRange] # readPrec :: ReadPrec RepeatRange # readListPrec :: ReadPrec [RepeatRange] # | |
Show RepeatRange Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> RepeatRange -> ShowS # show :: RepeatRange -> String # showList :: [RepeatRange] -> ShowS # | |
Eq RepeatRange Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord RepeatRange Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: RepeatRange -> RepeatRange -> Ordering # (<) :: RepeatRange -> RepeatRange -> Bool # (<=) :: RepeatRange -> RepeatRange -> Bool # (>) :: RepeatRange -> RepeatRange -> Bool # (>=) :: RepeatRange -> RepeatRange -> Bool # max :: RepeatRange -> RepeatRange -> RepeatRange # min :: RepeatRange -> RepeatRange -> RepeatRange # |
_RepeatRange :: Name Source #
data RepeatRange_Sequence_Option Source #
Constructors
RepeatRange_Sequence_Option | |
Instances
data RepeatRange_Sequence_Option_Alts_Option_Option Source #
Constructors
RepeatRange_Sequence_Option_Alts_Option_OptionInteger Integer_ | |
RepeatRange_Sequence_Option_Alts_Option_OptionAst |
Instances
Constructors
RdfType | |
Constructors
IriRef | |
Fields |
data IriRef_ListOfAlts_Elmt Source #
Instances
Constructors
PnameNs | |
Fields |
Constructors
PnameLn | |
Fields |
Constructors
AtpNameNs | |
Fields |
Instances
Read AtpNameNs Source # | |
Show AtpNameNs Source # | |
Eq AtpNameNs Source # | |
Ord AtpNameNs Source # | |
_AtpNameNs :: Name Source #
Constructors
AtpNameLn | |
Fields |
Instances
Read AtpNameLn Source # | |
Show AtpNameLn Source # | |
Eq AtpNameLn Source # | |
Ord AtpNameLn Source # | |
_AtpNameLn :: Name Source #
Constructors
Regexp | |
Fields |
data Regexp_ListOfAlts_Elmt Source #
Constructors
Regexp_ListOfAlts_ElmtRegex String | |
Regexp_ListOfAlts_ElmtSequence Regexp_ListOfAlts_Elmt_Sequence | |
Regexp_ListOfAlts_ElmtUchar Uchar |
Instances
data Regexp_ListOfAlts_Elmt_Sequence Source #
Constructors
Regexp_ListOfAlts_Elmt_Sequence | |
Instances
data BlankNodeLabel Source #
Constructors
BlankNodeLabel | |
Instances
Read BlankNodeLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS BlankNodeLabel # readList :: ReadS [BlankNodeLabel] # | |
Show BlankNodeLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> BlankNodeLabel -> ShowS # show :: BlankNodeLabel -> String # showList :: [BlankNodeLabel] -> ShowS # | |
Eq BlankNodeLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: BlankNodeLabel -> BlankNodeLabel -> Bool # (/=) :: BlankNodeLabel -> BlankNodeLabel -> Bool # | |
Ord BlankNodeLabel Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: BlankNodeLabel -> BlankNodeLabel -> Ordering # (<) :: BlankNodeLabel -> BlankNodeLabel -> Bool # (<=) :: BlankNodeLabel -> BlankNodeLabel -> Bool # (>) :: BlankNodeLabel -> BlankNodeLabel -> Bool # (>=) :: BlankNodeLabel -> BlankNodeLabel -> Bool # max :: BlankNodeLabel -> BlankNodeLabel -> BlankNodeLabel # min :: BlankNodeLabel -> BlankNodeLabel -> BlankNodeLabel # |
data BlankNodeLabel_Alts Source #
Instances
data BlankNodeLabel_ListOfAlts_Option_Elmt Source #
Constructors
BlankNodeLabel_ListOfAlts_Option_ElmtPnChars PnChars | |
BlankNodeLabel_ListOfAlts_Option_ElmtPeriod |
Instances
data StringLiteral1 Source #
Constructors
StringLiteral1 | |
Instances
Read StringLiteral1 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS StringLiteral1 # readList :: ReadS [StringLiteral1] # | |
Show StringLiteral1 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> StringLiteral1 -> ShowS # show :: StringLiteral1 -> String # showList :: [StringLiteral1] -> ShowS # | |
Eq StringLiteral1 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: StringLiteral1 -> StringLiteral1 -> Bool # (/=) :: StringLiteral1 -> StringLiteral1 -> Bool # | |
Ord StringLiteral1 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: StringLiteral1 -> StringLiteral1 -> Ordering # (<) :: StringLiteral1 -> StringLiteral1 -> Bool # (<=) :: StringLiteral1 -> StringLiteral1 -> Bool # (>) :: StringLiteral1 -> StringLiteral1 -> Bool # (>=) :: StringLiteral1 -> StringLiteral1 -> Bool # max :: StringLiteral1 -> StringLiteral1 -> StringLiteral1 # min :: StringLiteral1 -> StringLiteral1 -> StringLiteral1 # |
data StringLiteral1_ListOfAlts_Elmt Source #
Constructors
StringLiteral1_ListOfAlts_ElmtRegex String | |
StringLiteral1_ListOfAlts_ElmtEchar Echar | |
StringLiteral1_ListOfAlts_ElmtUchar Uchar |
Instances
data StringLiteral2 Source #
Constructors
StringLiteral2 | |
Instances
Read StringLiteral2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS StringLiteral2 # readList :: ReadS [StringLiteral2] # | |
Show StringLiteral2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> StringLiteral2 -> ShowS # show :: StringLiteral2 -> String # showList :: [StringLiteral2] -> ShowS # | |
Eq StringLiteral2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: StringLiteral2 -> StringLiteral2 -> Bool # (/=) :: StringLiteral2 -> StringLiteral2 -> Bool # | |
Ord StringLiteral2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: StringLiteral2 -> StringLiteral2 -> Ordering # (<) :: StringLiteral2 -> StringLiteral2 -> Bool # (<=) :: StringLiteral2 -> StringLiteral2 -> Bool # (>) :: StringLiteral2 -> StringLiteral2 -> Bool # (>=) :: StringLiteral2 -> StringLiteral2 -> Bool # max :: StringLiteral2 -> StringLiteral2 -> StringLiteral2 # min :: StringLiteral2 -> StringLiteral2 -> StringLiteral2 # |
data StringLiteral2_ListOfAlts_Elmt Source #
Constructors
StringLiteral2_ListOfAlts_ElmtRegex String | |
StringLiteral2_ListOfAlts_ElmtEchar Echar | |
StringLiteral2_ListOfAlts_ElmtUchar Uchar |
Instances
data StringLiteralLong1 Source #
Constructors
StringLiteralLong1 | |
Instances
data StringLiteralLong1_ListOfAlts_Elmt Source #
Constructors
StringLiteralLong1_ListOfAlts_ElmtSequence StringLiteralLong1_ListOfAlts_Elmt_Sequence | |
StringLiteralLong1_ListOfAlts_ElmtEchar Echar | |
StringLiteralLong1_ListOfAlts_ElmtUchar Uchar |
Instances
data StringLiteralLong1_ListOfAlts_Elmt_Sequence Source #
Constructors
StringLiteralLong1_ListOfAlts_Elmt_Sequence | |
Instances
data StringLiteralLong1_ListOfAlts_Elmt_Sequence_Alts_Option Source #
Constructors
StringLiteralLong1_ListOfAlts_Elmt_Sequence_Alts_OptionApos | |
StringLiteralLong1_ListOfAlts_Elmt_Sequence_Alts_OptionSequence StringLiteralLong1_ListOfAlts_Elmt_Sequence_Alts_Option_Sequence |
Instances
data StringLiteralLong1_ListOfAlts_Elmt_Sequence_Alts_Option_Sequence Source #
Instances
data StringLiteralLong2 Source #
Constructors
StringLiteralLong2 | |
Instances
data StringLiteralLong2_ListOfAlts_Elmt Source #
Constructors
StringLiteralLong2_ListOfAlts_ElmtSequence StringLiteralLong2_ListOfAlts_Elmt_Sequence | |
StringLiteralLong2_ListOfAlts_ElmtEchar Echar | |
StringLiteralLong2_ListOfAlts_ElmtUchar Uchar |
Instances
data StringLiteralLong2_ListOfAlts_Elmt_Sequence Source #
Constructors
StringLiteralLong2_ListOfAlts_Elmt_Sequence | |
Instances
data StringLiteralLong2_ListOfAlts_Elmt_Sequence_Alts_Option Source #
Constructors
StringLiteralLong2_ListOfAlts_Elmt_Sequence_Alts_OptionQuot | |
StringLiteralLong2_ListOfAlts_Elmt_Sequence_Alts_OptionSequence StringLiteralLong2_ListOfAlts_Elmt_Sequence_Alts_Option_Sequence |
Instances
data StringLiteralLong2_ListOfAlts_Elmt_Sequence_Alts_Option_Sequence Source #
Instances
Constructors
UcharSequence Uchar_Sequence | |
UcharSequence2 Uchar_Sequence2 |
data Uchar_Sequence Source #
Constructors
Uchar_Sequence | |
Fields |
Instances
Read Uchar_Sequence Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS Uchar_Sequence # readList :: ReadS [Uchar_Sequence] # | |
Show Uchar_Sequence Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> Uchar_Sequence -> ShowS # show :: Uchar_Sequence -> String # showList :: [Uchar_Sequence] -> ShowS # | |
Eq Uchar_Sequence Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: Uchar_Sequence -> Uchar_Sequence -> Bool # (/=) :: Uchar_Sequence -> Uchar_Sequence -> Bool # | |
Ord Uchar_Sequence Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: Uchar_Sequence -> Uchar_Sequence -> Ordering # (<) :: Uchar_Sequence -> Uchar_Sequence -> Bool # (<=) :: Uchar_Sequence -> Uchar_Sequence -> Bool # (>) :: Uchar_Sequence -> Uchar_Sequence -> Bool # (>=) :: Uchar_Sequence -> Uchar_Sequence -> Bool # max :: Uchar_Sequence -> Uchar_Sequence -> Uchar_Sequence # min :: Uchar_Sequence -> Uchar_Sequence -> Uchar_Sequence # |
data Uchar_Sequence2 Source #
Constructors
Uchar_Sequence2 | |
Fields |
Instances
Read Uchar_Sequence2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS Uchar_Sequence2 # readList :: ReadS [Uchar_Sequence2] # | |
Show Uchar_Sequence2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> Uchar_Sequence2 -> ShowS # show :: Uchar_Sequence2 -> String # showList :: [Uchar_Sequence2] -> ShowS # | |
Eq Uchar_Sequence2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods (==) :: Uchar_Sequence2 -> Uchar_Sequence2 -> Bool # (/=) :: Uchar_Sequence2 -> Uchar_Sequence2 -> Bool # | |
Ord Uchar_Sequence2 Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: Uchar_Sequence2 -> Uchar_Sequence2 -> Ordering # (<) :: Uchar_Sequence2 -> Uchar_Sequence2 -> Bool # (<=) :: Uchar_Sequence2 -> Uchar_Sequence2 -> Bool # (>) :: Uchar_Sequence2 -> Uchar_Sequence2 -> Bool # (>=) :: Uchar_Sequence2 -> Uchar_Sequence2 -> Bool # max :: Uchar_Sequence2 -> Uchar_Sequence2 -> Uchar_Sequence2 # min :: Uchar_Sequence2 -> Uchar_Sequence2 -> Uchar_Sequence2 # |
Constructors
Echar | |
Fields
|
data PnCharsBase Source #
Constructors
PnCharsBaseRegex String | |
PnCharsBaseRegex2 String |
Instances
Read PnCharsBase Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS PnCharsBase # readList :: ReadS [PnCharsBase] # readPrec :: ReadPrec PnCharsBase # readListPrec :: ReadPrec [PnCharsBase] # | |
Show PnCharsBase Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> PnCharsBase -> ShowS # show :: PnCharsBase -> String # showList :: [PnCharsBase] -> ShowS # | |
Eq PnCharsBase Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord PnCharsBase Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: PnCharsBase -> PnCharsBase -> Ordering # (<) :: PnCharsBase -> PnCharsBase -> Bool # (<=) :: PnCharsBase -> PnCharsBase -> Bool # (>) :: PnCharsBase -> PnCharsBase -> Bool # (>=) :: PnCharsBase -> PnCharsBase -> Bool # max :: PnCharsBase -> PnCharsBase -> PnCharsBase # min :: PnCharsBase -> PnCharsBase -> PnCharsBase # |
_PnCharsBase :: Name Source #
Constructors
PnCharsUPnCharsBase PnCharsBase | |
PnCharsULowbar |
Constructors
PnCharsPnCharsU PnCharsU | |
PnCharsMinus | |
PnCharsRegex String |
Constructors
PnPrefix | |
data PnPrefix_Sequence_Option Source #
Constructors
PnPrefix_Sequence_Option | |
Instances
data PnPrefix_Sequence_Option_Alts Source #
Instances
Constructors
PnLocal | |
data PnLocal_Alts Source #
Constructors
PnLocal_AltsPnCharsU PnCharsU | |
PnLocal_AltsColon | |
PnLocal_AltsRegex String | |
PnLocal_AltsPlx Plx |
Instances
Read PnLocal_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS PnLocal_Alts # readList :: ReadS [PnLocal_Alts] # | |
Show PnLocal_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> PnLocal_Alts -> ShowS # show :: PnLocal_Alts -> String # showList :: [PnLocal_Alts] -> ShowS # | |
Eq PnLocal_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord PnLocal_Alts Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: PnLocal_Alts -> PnLocal_Alts -> Ordering # (<) :: PnLocal_Alts -> PnLocal_Alts -> Bool # (<=) :: PnLocal_Alts -> PnLocal_Alts -> Bool # (>) :: PnLocal_Alts -> PnLocal_Alts -> Bool # (>=) :: PnLocal_Alts -> PnLocal_Alts -> Bool # max :: PnLocal_Alts -> PnLocal_Alts -> PnLocal_Alts # min :: PnLocal_Alts -> PnLocal_Alts -> PnLocal_Alts # |
_PnLocal_Alts :: Name Source #
data PnLocal_Sequence_Option Source #
Constructors
PnLocal_Sequence_Option | |
Instances
data PnLocal_Sequence_Option_ListOfAlts_Elmt Source #
Constructors
PnLocal_Sequence_Option_ListOfAlts_ElmtPnChars PnChars | |
PnLocal_Sequence_Option_ListOfAlts_ElmtPeriod | |
PnLocal_Sequence_Option_ListOfAlts_ElmtColon | |
PnLocal_Sequence_Option_ListOfAlts_ElmtPlx Plx |
Instances
data PnLocal_Sequence_Option_Alts Source #
Constructors
PnLocal_Sequence_Option_AltsPnChars PnChars | |
PnLocal_Sequence_Option_AltsColon | |
PnLocal_Sequence_Option_AltsPlx Plx |
Instances
Constructors
PlxPercent Percent | |
PlxPnLocalEsc PnLocalEsc |
Constructors
Percent | |
Fields
|
data PnLocalEsc Source #
Constructors
PnLocalEsc | |
Fields |
Instances
Read PnLocalEsc Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods readsPrec :: Int -> ReadS PnLocalEsc # readList :: ReadS [PnLocalEsc] # readPrec :: ReadPrec PnLocalEsc # readListPrec :: ReadPrec [PnLocalEsc] # | |
Show PnLocalEsc Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods showsPrec :: Int -> PnLocalEsc -> ShowS # show :: PnLocalEsc -> String # showList :: [PnLocalEsc] -> ShowS # | |
Eq PnLocalEsc Source # | |
Defined in Hydra.Ext.Shex.Syntax | |
Ord PnLocalEsc Source # | |
Defined in Hydra.Ext.Shex.Syntax Methods compare :: PnLocalEsc -> PnLocalEsc -> Ordering # (<) :: PnLocalEsc -> PnLocalEsc -> Bool # (<=) :: PnLocalEsc -> PnLocalEsc -> Bool # (>) :: PnLocalEsc -> PnLocalEsc -> Bool # (>=) :: PnLocalEsc -> PnLocalEsc -> Bool # max :: PnLocalEsc -> PnLocalEsc -> PnLocalEsc # min :: PnLocalEsc -> PnLocalEsc -> PnLocalEsc # |
_PnLocalEsc :: Name Source #