Safe Haskell | Safe |
---|---|
Language | Haskell98 |
- class SimpleType a where
- module Text.Parse
- newtype XsdString = XsdString String
- type Boolean = Bool
- data Base64Binary = Base64Binary String
- data HexBinary = HexBinary String
- data Float :: *
- data Decimal = Decimal Double
- data Double :: *
- data AnyURI = AnyURI String
- data QName
- data NOTATION = NOTATION String
- data Duration = Duration Bool Int Int Int Int Int Float
- data DateTime = DateTime String
- data Time = Time String
- data Date = Date String
- data GYearMonth = GYearMonth String
- data GYear = GYear String
- data GMonthDay = GMonthDay String
- data GDay = GDay String
- data GMonth = GMonth String
- newtype NormalizedString = Normalized String
- newtype Token = Token String
- newtype Language = Language String
- newtype Name = Name String
- newtype NCName = NCName String
- newtype ID = ID String
- newtype IDREF = IDREF String
- newtype IDREFS = IDREFS String
- newtype ENTITY = ENTITY String
- newtype ENTITIES = ENTITIES String
- newtype NMTOKEN = NMTOKEN String
- newtype NMTOKENS = NMTOKENS String
- data Integer :: *
- newtype NonPositiveInteger = NonPos Integer
- newtype NegativeInteger = Negative Integer
- newtype Long = Long Int64
- data Int :: *
- newtype Short = Short Int16
- newtype Byte = Byte Int8
- newtype NonNegativeInteger = NonNeg Integer
- newtype UnsignedLong = ULong Word64
- newtype UnsignedInt = UInt Word32
- newtype UnsignedShort = UShort Word16
- newtype UnsignedByte = UByte Word8
- newtype PositiveInteger = Positive Integer
Type class for parsing simpleTypes
class SimpleType a where Source #
Ultimately, an XML parser will find some plain text as the content of a simpleType, which will need to be parsed. We use a TextParser, because values of simpleTypes can also be given elsewhere, e.g. as attribute values in an XSD definition, e.g. to restrict the permissible values of the simpleType. Such restrictions are therefore implemented as layered parsers.
acceptingParser :: TextParser a Source #
simpleTypeText :: a -> String Source #
module Text.Parse
Primitive XSD datatypes
data Base64Binary Source #
Single-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE single-precision type.
Eq Float | |
Floating Float | |
Ord Float | |
Read Float | |
RealFloat Float | |
Parse Float | |
SimpleType Float Source # | |
HTypeable Float Source # | |
SchemaType Float Source # | |
Functor (URec Float) | |
Foldable (URec Float) | |
Generic1 (URec Float) | |
Eq (URec Float p) | |
Ord (URec Float p) | |
Show (URec Float p) | |
Generic (URec Float p) | |
data URec Float | Used for marking occurrences of |
type Rep1 (URec Float) | |
type Rep (URec Float p) | |
Double-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE double-precision type.
Eq Double | |
Floating Double | |
Ord Double | |
Read Double | |
RealFloat Double | |
Parse Double | |
SimpleType Double Source # | |
HTypeable Double Source # | |
SchemaType Double Source # | |
Functor (URec Double) | |
Foldable (URec Double) | |
Generic1 (URec Double) | |
Eq (URec Double p) | |
Ord (URec Double p) | |
Show (URec Double p) | |
Generic (URec Double p) | |
data URec Double | Used for marking occurrences of |
type Rep1 (URec Double) | |
type Rep (URec Double p) | |
A QName is a (possibly) qualified name, in the sense of XML namespaces.
data GYearMonth Source #
Derived, yet builtin, datatypes
newtype NormalizedString Source #
newtype NonPositiveInteger Source #
newtype NegativeInteger Source #
A fixed-precision integer type with at least the range [-2^29 .. 2^29-1]
.
The exact range for a given implementation can be determined by using
minBound
and maxBound
from the Bounded
class.
Bounded Int | |
Enum Int | |
Eq Int | |
Integral Int | |
Num Int | |
Ord Int | |
Read Int | |
Real Int | |
Show Int | |
Ix Int | |
Parse Int | |
SimpleType Int Source # | |
HTypeable Int Source # | |
SchemaType Int Source # | |
Functor (URec Int) | |
Foldable (URec Int) | |
Generic1 (URec Int) | |
Eq (URec Int p) | |
Ord (URec Int p) | |
Show (URec Int p) | |
Generic (URec Int p) | |
data URec Int | Used for marking occurrences of |
type Rep1 (URec Int) | |
type Rep (URec Int p) | |
newtype NonNegativeInteger Source #
newtype UnsignedLong Source #
newtype UnsignedInt Source #
newtype UnsignedShort Source #
newtype UnsignedByte Source #