Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell98 |
Text.XML.HaXml.Schema.PrimitiveTypes
Synopsis
- class SimpleType a where
- acceptingParser :: TextParser a
- simpleTypeText :: a -> String
- class Parse a where
- parse :: TextParser a
- parsePrec :: Int -> TextParser a
- parseList :: TextParser [a]
- class Applicative f => Alternative (f :: Type -> Type) where
- literal :: String -> TextParser String
- parens :: Bool -> TextParser a -> TextParser a
- newtype Parser t a = P ([t] -> Result [t] a)
- bracket :: PolyParse p => p bra -> p ket -> p a -> p a
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- class Functor f => Applicative (f :: Type -> Type) where
- (<$) :: Functor f => a -> f b -> f a
- (<**>) :: Applicative f => f a -> f (a -> b) -> f b
- liftA :: Applicative f => (a -> b) -> f a -> f b
- liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d
- asum :: (Foldable t, Alternative f) => t (f a) -> f a
- newtype Const a (b :: k) = Const {
- getConst :: a
- type TextParser a = Parser Char a
- next :: Parser t t
- word :: TextParser String
- satisfy :: (t -> Bool) -> Parser t t
- onFail :: Parser t a -> Parser t a -> Parser t a
- apply :: PolyParse p => p (a -> b) -> p a -> p b
- discard :: PolyParse p => p a -> p b -> p a
- parseDec :: Integral a => TextParser a
- parseFloat :: RealFrac a => TextParser a
- class Commitment (p :: Type -> Type) where
- class (Functor p, Monad p, MonadFail p, Applicative p, Alternative p, Commitment p) => PolyParse (p :: Type -> Type)
- adjustErrBad :: PolyParse p => p a -> (String -> String) -> p a
- bracketSep :: PolyParse p => p bra -> p sep -> p ket -> p a -> p [a]
- exactly :: PolyParse p => Int -> p a -> p [a]
- failBad :: PolyParse p => String -> p a
- indent :: Int -> String -> String
- many1 :: PolyParse p => p a -> p [a]
- manyFinally :: PolyParse p => p a -> p z -> p [a]
- manyFinally' :: (PolyParse p, Show a) => p a -> p z -> p [a]
- oneOf :: PolyParse p => [p a] -> p a
- sepBy :: PolyParse p => p a -> p sep -> p [a]
- sepBy1 :: PolyParse p => p a -> p sep -> p [a]
- upto :: PolyParse p => Int -> p a -> p [a]
- eof :: Parser t ()
- reparse :: [t] -> Parser t ()
- satisfyMsg :: Show t => (t -> Bool) -> String -> Parser t t
- runParser :: Parser t a -> [t] -> (Either String a, [t])
- data Result z a
- enumeration :: Show a => String -> [a] -> TextParser a
- parseHex :: Integral a => TextParser a
- parseInt :: Integral a => String -> a -> (Char -> Bool) -> (Char -> Int) -> TextParser a
- parseOct :: Integral a => TextParser a
- parseSigned :: Real a => TextParser a -> TextParser a
- optional :: Alternative f => f a -> f (Maybe a)
- allAsString :: TextParser String
- constructors :: [(String, TextParser a)] -> TextParser a
- field :: Parse a => String -> TextParser a
- isWord :: String -> TextParser String
- optionalParens :: TextParser a -> TextParser a
- parseByRead :: Read a => String -> TextParser a
- parseLitChar :: TextParser Char
- parseLitChar' :: TextParser Char
- readByParse :: TextParser a -> ReadS a
- readsPrecByParsePrec :: (Int -> TextParser a) -> Int -> ReadS a
- newtype WrappedArrow (a :: Type -> Type -> Type) b c = WrapArrow {
- unwrapArrow :: a b c
- newtype WrappedMonad (m :: Type -> Type) a = WrapMonad {
- unwrapMonad :: m a
- newtype ZipList a = ZipList {
- getZipList :: [a]
- 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.
Instances
Minimal complete definition
Nothing
Instances
class Applicative f => Alternative (f :: Type -> Type) where #
Instances
literal :: String -> TextParser String #
parens :: Bool -> TextParser a -> TextParser a #
Instances
MonadFail (Parser t) | |
Defined in Text.ParserCombinators.Poly.Parser | |
Alternative (Parser t) | |
Applicative (Parser t) | |
Functor (Parser t) | |
Monad (Parser t) | |
Commitment (Parser t) | |
PolyParse (Parser t) | |
Defined in Text.ParserCombinators.Poly.Parser |
class Functor f => Applicative (f :: Type -> Type) where #
Instances
Applicative ZipList | |
Applicative Complex | |
Applicative Identity | |
Applicative First | |
Applicative Last | |
Applicative Down | |
Applicative First | |
Applicative Last | |
Applicative Max | |
Applicative Min | |
Applicative NonEmpty | |
Applicative STM | |
Applicative NoIO | |
Applicative Par1 | |
Applicative P | |
Applicative ReadP | |
Applicative ReadPrec | |
Applicative Put | |
Applicative Seq | |
Applicative Tree | |
Applicative IO | |
Applicative Parser | |
Applicative Parser | |
Applicative Parser | |
Applicative Parser | |
Applicative Maybe | |
Applicative Solo | |
Applicative [] | |
Monad m => Applicative (WrappedMonad m) | |
Defined in Control.Applicative Methods pure :: a -> WrappedMonad m a # (<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b # liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c # (*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # (<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a # | |
Arrow a => Applicative (ArrowMonad a) | |
Defined in Control.Arrow Methods pure :: a0 -> ArrowMonad a a0 # (<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b # liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c # (*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b # (<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 # | |
Applicative (Either e) | |
Applicative (Proxy :: Type -> Type) | |
Applicative (U1 :: Type -> Type) | |
Applicative (ST s) | |
Applicative (SetM s) | |
Applicative (Parser t) | |
Applicative (Parser t) | |
Applicative (Parser t) | |
Applicative (Parser s) | |
Defined in Text.ParserCombinators.Poly.StateText | |
Monoid a => Applicative ((,) a) | |
Arrow a => Applicative (WrappedArrow a b) | |
Defined in Control.Applicative Methods pure :: a0 -> WrappedArrow a b a0 # (<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c # (*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 # (<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |
Applicative m => Applicative (Kleisli m a) | |
Defined in Control.Arrow | |
Monoid m => Applicative (Const m :: Type -> Type) | |
Applicative f => Applicative (Ap f) | |
(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) | |
Defined in GHC.Generics Methods pure :: a -> Generically1 f a # (<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b # liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c # (*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b # (<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a # | |
Applicative f => Applicative (Rec1 f) | |
(Applicative f, Monad f) => Applicative (WhenMissing f x) | |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMissing f x a # (<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b # liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c # (*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # (<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a # | |
Applicative (Parser s t) | |
Defined in Text.ParserCombinators.Poly.StateLazy | |
Applicative (Parser s t) | |
Defined in Text.ParserCombinators.Poly.StateParser | |
(Monoid a, Monoid b) => Applicative ((,,) a b) | |
(Applicative f, Applicative g) => Applicative (Product f g) | |
Defined in Data.Functor.Product | |
(Applicative f, Applicative g) => Applicative (f :*: g) | |
Monoid c => Applicative (K1 i c :: Type -> Type) | |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) | |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMatched f x y a # (<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c # (*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # (<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Applicative (WhenMissing f k x) | |
Defined in Data.Map.Internal Methods pure :: a -> WhenMissing f k x a # (<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b # liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c # (*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b # (<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a # | |
Applicative (Parser s t e) | |
Defined in Text.ParserCombinators.HuttonMeijerWallace | |
(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) | |
Defined in GHC.Base | |
Applicative ((->) r) | |
(Applicative f, Applicative g) => Applicative (Compose f g) | |
Defined in Data.Functor.Compose | |
(Applicative f, Applicative g) => Applicative (f :.: g) | |
Applicative f => Applicative (M1 i c f) | |
(Monad f, Applicative f) => Applicative (WhenMatched f k x y) | |
Defined in Data.Map.Internal Methods pure :: a -> WhenMatched f k x y a # (<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b # liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c # (*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b # (<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a # |
(<**>) :: Applicative f => f a -> f (a -> b) -> f b #
liftA :: Applicative f => (a -> b) -> f a -> f b #
liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #
asum :: (Foldable t, Alternative f) => t (f a) -> f a #
Instances
Generic1 (Const a :: k -> Type) | |||||
Defined in Data.Functor.Const Associated Types
| |||||
Bifoldable (Const :: Type -> Type -> Type) | |||||
Bifoldable1 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Bifoldable1 Methods bifold1 :: Semigroup m => Const m m -> m bifoldMap1 :: Semigroup m => (a -> m) -> (b -> m) -> Const a b -> m | |||||
Bifunctor (Const :: Type -> Type -> Type) | |||||
Bitraversable (Const :: Type -> Type -> Type) | |||||
Defined in Data.Bitraversable Methods bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) | |||||
Eq2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes | |||||
Ord2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Const a c -> Const b d -> Ordering | |||||
Read2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] | |||||
Show2 (Const :: Type -> Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Const a b -> ShowS liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Const a b] -> ShowS | |||||
Foldable (Const m :: Type -> Type) | |||||
Defined in Data.Functor.Const Methods fold :: Monoid m0 => Const m m0 -> m0 foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 foldr :: (a -> b -> b) -> b -> Const m a -> b foldr' :: (a -> b -> b) -> b -> Const m a -> b foldl :: (b -> a -> b) -> b -> Const m a -> b foldl' :: (b -> a -> b) -> b -> Const m a -> b foldr1 :: (a -> a -> a) -> Const m a -> a foldl1 :: (a -> a -> a) -> Const m a -> a elem :: Eq a => a -> Const m a -> Bool maximum :: Ord a => Const m a -> a minimum :: Ord a => Const m a -> a | |||||
Eq a => Eq1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes | |||||
Ord a => Ord1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering | |||||
Read a => Read1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] | |||||
Show a => Show1 (Const a :: Type -> Type) | |||||
Defined in Data.Functor.Classes Methods liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Const a a0 -> ShowS liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Const a a0] -> ShowS | |||||
Contravariant (Const a :: Type -> Type) | |||||
Traversable (Const m :: Type -> Type) | |||||
Defined in Data.Traversable | |||||
Monoid m => Applicative (Const m :: Type -> Type) | |||||
Functor (Const m :: Type -> Type) | |||||
(Typeable k, Data a, Typeable b) => Data (Const a b) | |||||
Defined in Data.Data Methods gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) toConstr :: Const a b -> Constr dataTypeOf :: Const a b -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) | |||||
IsString a => IsString (Const a b) | |||||
Defined in Data.String Methods fromString :: String -> Const a b | |||||
Storable a => Storable (Const a b) | |||||
Defined in Data.Functor.Const Methods peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () peekByteOff :: Ptr b0 -> Int -> IO (Const a b) pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () | |||||
Monoid a => Monoid (Const a b) | |||||
Semigroup a => Semigroup (Const a b) | |||||
Bits a => Bits (Const a b) | |||||
Defined in Data.Functor.Const Methods (.&.) :: Const a b -> Const a b -> Const a b (.|.) :: Const a b -> Const a b -> Const a b xor :: Const a b -> Const a b -> Const a b complement :: Const a b -> Const a b shift :: Const a b -> Int -> Const a b rotate :: Const a b -> Int -> Const a b setBit :: Const a b -> Int -> Const a b clearBit :: Const a b -> Int -> Const a b complementBit :: Const a b -> Int -> Const a b testBit :: Const a b -> Int -> Bool bitSizeMaybe :: Const a b -> Maybe Int shiftL :: Const a b -> Int -> Const a b unsafeShiftL :: Const a b -> Int -> Const a b shiftR :: Const a b -> Int -> Const a b unsafeShiftR :: Const a b -> Int -> Const a b rotateL :: Const a b -> Int -> Const a b | |||||
FiniteBits a => FiniteBits (Const a b) | |||||
Defined in Data.Functor.Const Methods finiteBitSize :: Const a b -> Int countLeadingZeros :: Const a b -> Int countTrailingZeros :: Const a b -> Int | |||||
Bounded a => Bounded (Const a b) | |||||
Defined in Data.Functor.Const | |||||
Enum a => Enum (Const a b) | |||||
Defined in Data.Functor.Const | |||||
Floating a => Floating (Const a b) | |||||
Defined in Data.Functor.Const Methods sqrt :: Const a b -> Const a b (**) :: Const a b -> Const a b -> Const a b logBase :: Const a b -> Const a b -> Const a b asin :: Const a b -> Const a b acos :: Const a b -> Const a b atan :: Const a b -> Const a b sinh :: Const a b -> Const a b cosh :: Const a b -> Const a b tanh :: Const a b -> Const a b asinh :: Const a b -> Const a b acosh :: Const a b -> Const a b atanh :: Const a b -> Const a b log1p :: Const a b -> Const a b expm1 :: Const a b -> Const a b | |||||
RealFloat a => RealFloat (Const a b) | |||||
Defined in Data.Functor.Const Methods floatRadix :: Const a b -> Integer floatDigits :: Const a b -> Int floatRange :: Const a b -> (Int, Int) decodeFloat :: Const a b -> (Integer, Int) encodeFloat :: Integer -> Int -> Const a b significand :: Const a b -> Const a b scaleFloat :: Int -> Const a b -> Const a b isInfinite :: Const a b -> Bool isDenormalized :: Const a b -> Bool isNegativeZero :: Const a b -> Bool | |||||
Generic (Const a b) | |||||
Defined in Data.Functor.Const Associated Types
| |||||
Ix a => Ix (Const a b) | |||||
Defined in Data.Functor.Const Methods range :: (Const a b, Const a b) -> [Const a b] index :: (Const a b, Const a b) -> Const a b -> Int unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int inRange :: (Const a b, Const a b) -> Const a b -> Bool rangeSize :: (Const a b, Const a b) -> Int unsafeRangeSize :: (Const a b, Const a b) -> Int | |||||
Num a => Num (Const a b) | |||||
Read a => Read (Const a b) | |||||
Defined in Data.Functor.Const | |||||
Fractional a => Fractional (Const a b) | |||||
Defined in Data.Functor.Const | |||||
Integral a => Integral (Const a b) | |||||
Defined in Data.Functor.Const | |||||
Real a => Real (Const a b) | |||||
Defined in Data.Functor.Const Methods toRational :: Const a b -> Rational | |||||
RealFrac a => RealFrac (Const a b) | |||||
Show a => Show (Const a b) | |||||
Eq a => Eq (Const a b) | |||||
Ord a => Ord (Const a b) | |||||
Defined in Data.Functor.Const | |||||
type Rep1 (Const a :: k -> Type) | |||||
Defined in Data.Functor.Const type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) | |||||
type Rep (Const a b) | |||||
Defined in Data.Functor.Const type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) |
type TextParser a = Parser Char a #
word :: TextParser String #
parseDec :: Integral a => TextParser a #
parseFloat :: RealFrac a => TextParser a #
class Commitment (p :: Type -> Type) where #
Instances
Commitment Parser | |
Commitment Parser | |
Commitment Parser | |
Commitment (Parser t) | |
Commitment (Parser t) | |
Commitment (Parser t) | |
Commitment (Parser s) | |
Commitment (Parser s t) | |
Commitment (Parser s t) | |
class (Functor p, Monad p, MonadFail p, Applicative p, Alternative p, Commitment p) => PolyParse (p :: Type -> Type) #
Instances
PolyParse Parser | |
Defined in Text.ParserCombinators.Poly.ByteString | |
PolyParse Parser | |
Defined in Text.ParserCombinators.Poly.ByteStringChar | |
PolyParse Parser | |
Defined in Text.ParserCombinators.Poly.Text | |
PolyParse (Parser t) | |
Defined in Text.ParserCombinators.Poly.Lazy | |
PolyParse (Parser t) | |
Defined in Text.ParserCombinators.Poly.Lex | |
PolyParse (Parser t) | |
Defined in Text.ParserCombinators.Poly.Parser | |
PolyParse (Parser s) | |
Defined in Text.ParserCombinators.Poly.StateText | |
PolyParse (Parser s t) | |
Defined in Text.ParserCombinators.Poly.StateLazy | |
PolyParse (Parser s t) | |
Defined in Text.ParserCombinators.Poly.StateParser |
adjustErrBad :: PolyParse p => p a -> (String -> String) -> p a #
bracketSep :: PolyParse p => p bra -> p sep -> p ket -> p a -> p [a] #
manyFinally :: PolyParse p => p a -> p z -> p [a] #
manyFinally' :: (PolyParse p, Show a) => p a -> p z -> p [a] #
satisfyMsg :: Show t => (t -> Bool) -> String -> Parser t t #
enumeration :: Show a => String -> [a] -> TextParser a #
parseHex :: Integral a => TextParser a #
parseInt :: Integral a => String -> a -> (Char -> Bool) -> (Char -> Int) -> TextParser a #
parseOct :: Integral a => TextParser a #
parseSigned :: Real a => TextParser a -> TextParser a #
optional :: Alternative f => f a -> f (Maybe a) #
allAsString :: TextParser String #
constructors :: [(String, TextParser a)] -> TextParser a #
field :: Parse a => String -> TextParser a #
isWord :: String -> TextParser String #
optionalParens :: TextParser a -> TextParser a #
parseByRead :: Read a => String -> TextParser a #
parseLitChar :: TextParser Char #
parseLitChar' :: TextParser Char #
readByParse :: TextParser a -> ReadS a #
readsPrecByParsePrec :: (Int -> TextParser a) -> Int -> ReadS a #
newtype WrappedArrow (a :: Type -> Type -> Type) b c #
Constructors
WrapArrow | |
Fields
|
Instances
Generic1 (WrappedArrow a b :: Type -> Type) | |||||
Defined in Control.Applicative Associated Types
Methods from1 :: WrappedArrow a b a0 -> Rep1 (WrappedArrow a b) a0 to1 :: Rep1 (WrappedArrow a b) a0 -> WrappedArrow a b a0 | |||||
(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) | |||||
Defined in Control.Applicative Methods empty :: WrappedArrow a b a0 # (<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 # some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # | |||||
Arrow a => Applicative (WrappedArrow a b) | |||||
Defined in Control.Applicative Methods pure :: a0 -> WrappedArrow a b a0 # (<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 # liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c # (*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 # (<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |||||
Arrow a => Functor (WrappedArrow a b) | |||||
Defined in Control.Applicative Methods fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 (<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 # | |||||
(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c) | |||||
Defined in Data.Data Methods gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c) gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c) toConstr :: WrappedArrow a b c -> Constr dataTypeOf :: WrappedArrow a b c -> DataType dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c)) gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) | |||||
Generic (WrappedArrow a b c) | |||||
Defined in Control.Applicative Associated Types
Methods from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c | |||||
type Rep1 (WrappedArrow a b :: Type -> Type) | |||||
Defined in Control.Applicative type Rep1 (WrappedArrow a b :: Type -> Type) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (a b)))) | |||||
type Rep (WrappedArrow a b c) | |||||
Defined in Control.Applicative type Rep (WrappedArrow a b c) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a b c)))) |
newtype WrappedMonad (m :: Type -> Type) a #
Constructors
WrapMonad | |
Fields
|
Instances
Generic1 (WrappedMonad m :: Type -> Type) | |||||
Defined in Control.Applicative Associated Types
Methods from1 :: WrappedMonad m a -> Rep1 (WrappedMonad m) a to1 :: Rep1 (WrappedMonad m) a -> WrappedMonad m a | |||||
MonadPlus m => Alternative (WrappedMonad m) | |||||
Defined in Control.Applicative Methods empty :: WrappedMonad m a # (<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a # some :: WrappedMonad m a -> WrappedMonad m [a] # many :: WrappedMonad m a -> WrappedMonad m [a] # | |||||
Monad m => Applicative (WrappedMonad m) | |||||
Defined in Control.Applicative Methods pure :: a -> WrappedMonad m a # (<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b # liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c # (*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # (<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a # | |||||
Monad m => Functor (WrappedMonad m) | |||||
Defined in Control.Applicative Methods fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b (<$) :: a -> WrappedMonad m b -> WrappedMonad m a # | |||||
Monad m => Monad (WrappedMonad m) | |||||
Defined in Control.Applicative Methods (>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b (>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b return :: a -> WrappedMonad m a | |||||
(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a) | |||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a) toConstr :: WrappedMonad m a -> Constr dataTypeOf :: WrappedMonad m a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a)) gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) | |||||
Generic (WrappedMonad m a) | |||||
Defined in Control.Applicative Associated Types
Methods from :: WrappedMonad m a -> Rep (WrappedMonad m a) x to :: Rep (WrappedMonad m a) x -> WrappedMonad m a | |||||
type Rep1 (WrappedMonad m :: Type -> Type) | |||||
Defined in Control.Applicative type Rep1 (WrappedMonad m :: Type -> Type) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 m))) | |||||
type Rep (WrappedMonad m a) | |||||
Defined in Control.Applicative type Rep (WrappedMonad m a) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m a)))) |
Constructors
ZipList | |
Fields
|
Instances
Foldable ZipList | |||||
Defined in Control.Applicative Methods fold :: Monoid m => ZipList m -> m foldMap :: Monoid m => (a -> m) -> ZipList a -> m foldMap' :: Monoid m => (a -> m) -> ZipList a -> m foldr :: (a -> b -> b) -> b -> ZipList a -> b foldr' :: (a -> b -> b) -> b -> ZipList a -> b foldl :: (b -> a -> b) -> b -> ZipList a -> b foldl' :: (b -> a -> b) -> b -> ZipList a -> b foldr1 :: (a -> a -> a) -> ZipList a -> a foldl1 :: (a -> a -> a) -> ZipList a -> a elem :: Eq a => a -> ZipList a -> Bool maximum :: Ord a => ZipList a -> a minimum :: Ord a => ZipList a -> a | |||||
Traversable ZipList | |||||
Defined in Data.Traversable | |||||
Alternative ZipList | |||||
Applicative ZipList | |||||
Functor ZipList | |||||
Generic1 ZipList | |||||
Defined in Control.Applicative Associated Types
| |||||
Data a => Data (ZipList a) | |||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a) toConstr :: ZipList a -> Constr dataTypeOf :: ZipList a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a)) gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) | |||||
Generic (ZipList a) | |||||
Defined in Control.Applicative Associated Types
| |||||
IsList (ZipList a) | |||||
Read a => Read (ZipList a) | |||||
Defined in Control.Applicative | |||||
Show a => Show (ZipList a) | |||||
Eq a => Eq (ZipList a) | |||||
Ord a => Ord (ZipList a) | |||||
Defined in Control.Applicative | |||||
type Rep1 ZipList | |||||
Defined in Control.Applicative type Rep1 ZipList = D1 ('MetaData "ZipList" "Control.Applicative" "base" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 []))) | |||||
type Rep (ZipList a) | |||||
Defined in Control.Applicative type Rep (ZipList a) = D1 ('MetaData "ZipList" "Control.Applicative" "base" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a]))) | |||||
type Item (ZipList a) | |||||
Defined in GHC.IsList type Item (ZipList a) = a |
Primitive XSD datatypes
Constructors
XsdString String |
Instances
SimpleType XsdString Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser XsdString Source # simpleTypeText :: XsdString -> String Source # | |
SchemaType XsdString Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser XsdString Source # schemaTypeToXML :: String -> XsdString -> [Content ()] Source # | |
Show XsdString Source # | |
Eq XsdString Source # | |
data Base64Binary Source #
Constructors
Base64Binary String |
Instances
SimpleType Base64Binary Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser Base64Binary Source # simpleTypeText :: Base64Binary -> String Source # | |
SchemaType Base64Binary Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Base64Binary Source # schemaTypeToXML :: String -> Base64Binary -> [Content ()] Source # | |
Show Base64Binary Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> Base64Binary -> ShowS show :: Base64Binary -> String showList :: [Base64Binary] -> ShowS | |
Eq Base64Binary Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes |
Constructors
HexBinary String |
Instances
SimpleType HexBinary Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser HexBinary Source # simpleTypeText :: HexBinary -> String Source # | |
SchemaType HexBinary Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser HexBinary Source # schemaTypeToXML :: String -> HexBinary -> [Content ()] Source # | |
Show HexBinary Source # | |
Eq HexBinary Source # | |
Instances
SimpleType Float Source # | |||||
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |||||
SchemaType Float Source # | |||||
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Float Source # schemaTypeToXML :: String -> Float -> [Content ()] Source # | |||||
HTypeable Float Source # | |||||
XmlContent Float Source # | |||||
Data Float | |||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float dataTypeOf :: Float -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) gmapT :: (forall b. Data b => b -> b) -> Float -> Float gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float | |||||
Storable Float | |||||
Defined in Foreign.Storable | |||||
Floating Float | |||||
RealFloat Float | |||||
Defined in GHC.Float Methods floatRadix :: Float -> Integer floatDigits :: Float -> Int floatRange :: Float -> (Int, Int) decodeFloat :: Float -> (Integer, Int) encodeFloat :: Integer -> Int -> Float significand :: Float -> Float scaleFloat :: Int -> Float -> Float isInfinite :: Float -> Bool isDenormalized :: Float -> Bool isNegativeZero :: Float -> Bool | |||||
Read Float | |||||
PrintfArg Float | |||||
Defined in Text.Printf | |||||
Eq Float | |||||
Ord Float | |||||
Parse Float | |||||
Defined in Text.Parse Methods parse :: TextParser Float # parsePrec :: Int -> TextParser Float # parseList :: TextParser [Float] # | |||||
Parse Float | |||||
Pretty Float | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Float -> Doc ann pPrintList :: PrettyLevel -> [Float] -> Doc ann | |||||
Pretty Float | |||||
Defined in Text.PrettyPrint.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Float -> Doc pPrintList :: PrettyLevel -> [Float] -> Doc | |||||
Random Float | |||||
UniformRange Float | |||||
Defined in System.Random.Internal | |||||
Generic1 (URec Float :: k -> Type) | |||||
Defined in GHC.Generics Associated Types
| |||||
Foldable (UFloat :: Type -> Type) | |||||
Defined in Data.Foldable Methods fold :: Monoid m => UFloat m -> m foldMap :: Monoid m => (a -> m) -> UFloat a -> m foldMap' :: Monoid m => (a -> m) -> UFloat a -> m foldr :: (a -> b -> b) -> b -> UFloat a -> b foldr' :: (a -> b -> b) -> b -> UFloat a -> b foldl :: (b -> a -> b) -> b -> UFloat a -> b foldl' :: (b -> a -> b) -> b -> UFloat a -> b foldr1 :: (a -> a -> a) -> UFloat a -> a foldl1 :: (a -> a -> a) -> UFloat a -> a toList :: UFloat a -> [a] null :: UFloat a -> Bool elem :: Eq a => a -> UFloat a -> Bool maximum :: Ord a => UFloat a -> a minimum :: Ord a => UFloat a -> a sum :: Num a => UFloat a -> a product :: Num a => UFloat a -> a | |||||
Traversable (UFloat :: Type -> Type) | |||||
Defined in Data.Traversable Methods traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) sequence :: Monad m => UFloat (m a) -> m (UFloat a) | |||||
Functor (URec Float :: Type -> Type) | |||||
Generic (URec Float p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Float p) | |||||
Eq (URec Float p) | |||||
Ord (URec Float p) | |||||
Defined in GHC.Generics | |||||
data URec Float (p :: k) | |||||
Defined in GHC.Generics | |||||
type Rep1 (URec Float :: k -> Type) | |||||
Defined in GHC.Generics type Rep1 (URec Float :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: k -> Type))) | |||||
type Rep (URec Float p) | |||||
Defined in GHC.Generics type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type))) |
Instances
SimpleType Decimal Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Decimal Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Decimal Source # schemaTypeToXML :: String -> Decimal -> [Content ()] Source # | |
Show Decimal Source # | |
Eq Decimal Source # | |
Instances
SimpleType Double Source # | |||||
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |||||
SchemaType Double Source # | |||||
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Double Source # schemaTypeToXML :: String -> Double -> [Content ()] Source # | |||||
HTypeable Double Source # | |||||
XmlContent Double Source # | |||||
Data Double | |||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double dataTypeOf :: Double -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) gmapT :: (forall b. Data b => b -> b) -> Double -> Double gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double | |||||
Storable Double | |||||
Defined in Foreign.Storable Methods peekElemOff :: Ptr Double -> Int -> IO Double pokeElemOff :: Ptr Double -> Int -> Double -> IO () peekByteOff :: Ptr b -> Int -> IO Double pokeByteOff :: Ptr b -> Int -> Double -> IO () | |||||
Floating Double | |||||
RealFloat Double | |||||
Defined in GHC.Float Methods floatRadix :: Double -> Integer floatDigits :: Double -> Int floatRange :: Double -> (Int, Int) decodeFloat :: Double -> (Integer, Int) encodeFloat :: Integer -> Int -> Double significand :: Double -> Double scaleFloat :: Int -> Double -> Double isInfinite :: Double -> Bool isDenormalized :: Double -> Bool isNegativeZero :: Double -> Bool | |||||
Read Double | |||||
PrintfArg Double | |||||
Defined in Text.Printf | |||||
Eq Double | |||||
Ord Double | |||||
Parse Double | |||||
Defined in Text.Parse Methods parse :: TextParser Double # parsePrec :: Int -> TextParser Double # parseList :: TextParser [Double] # | |||||
Parse Double | |||||
Pretty Double | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Double -> Doc ann pPrintList :: PrettyLevel -> [Double] -> Doc ann | |||||
Pretty Double | |||||
Defined in Text.PrettyPrint.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Double -> Doc pPrintList :: PrettyLevel -> [Double] -> Doc | |||||
Random Double | |||||
UniformRange Double | |||||
Defined in System.Random.Internal | |||||
Generic1 (URec Double :: k -> Type) | |||||
Defined in GHC.Generics Associated Types
| |||||
Foldable (UDouble :: Type -> Type) | |||||
Defined in Data.Foldable Methods fold :: Monoid m => UDouble m -> m foldMap :: Monoid m => (a -> m) -> UDouble a -> m foldMap' :: Monoid m => (a -> m) -> UDouble a -> m foldr :: (a -> b -> b) -> b -> UDouble a -> b foldr' :: (a -> b -> b) -> b -> UDouble a -> b foldl :: (b -> a -> b) -> b -> UDouble a -> b foldl' :: (b -> a -> b) -> b -> UDouble a -> b foldr1 :: (a -> a -> a) -> UDouble a -> a foldl1 :: (a -> a -> a) -> UDouble a -> a toList :: UDouble a -> [a] null :: UDouble a -> Bool elem :: Eq a => a -> UDouble a -> Bool maximum :: Ord a => UDouble a -> a minimum :: Ord a => UDouble a -> a sum :: Num a => UDouble a -> a product :: Num a => UDouble a -> a | |||||
Traversable (UDouble :: Type -> Type) | |||||
Defined in Data.Traversable Methods traverse :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b) sequenceA :: Applicative f => UDouble (f a) -> f (UDouble a) mapM :: Monad m => (a -> m b) -> UDouble a -> m (UDouble b) sequence :: Monad m => UDouble (m a) -> m (UDouble a) | |||||
Functor (URec Double :: Type -> Type) | |||||
Generic (URec Double p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Double p) | |||||
Eq (URec Double p) | |||||
Ord (URec Double p) | |||||
Defined in GHC.Generics | |||||
data URec Double (p :: k) | |||||
Defined in GHC.Generics | |||||
type Rep1 (URec Double :: k -> Type) | |||||
Defined in GHC.Generics type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type))) | |||||
type Rep (URec Double p) | |||||
Defined in GHC.Generics type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type))) |
Constructors
AnyURI String |
Instances
SimpleType AnyURI Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType AnyURI Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser AnyURI Source # schemaTypeToXML :: String -> AnyURI -> [Content ()] Source # | |
Show AnyURI Source # | |
Eq AnyURI Source # | |
A QName is a (possibly) qualified name, in the sense of XML namespaces.
Constructors
NOTATION String |
Instances
SimpleType NOTATION Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType NOTATION Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NOTATION Source # schemaTypeToXML :: String -> NOTATION -> [Content ()] Source # | |
Show NOTATION Source # | |
Eq NOTATION Source # | |
Instances
SimpleType Duration Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Duration Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Duration Source # schemaTypeToXML :: String -> Duration -> [Content ()] Source # | |
Show Duration Source # | |
Eq Duration Source # | |
Constructors
DateTime String |
Instances
SimpleType DateTime Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType DateTime Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser DateTime Source # schemaTypeToXML :: String -> DateTime -> [Content ()] Source # | |
Show DateTime Source # | |
Eq DateTime Source # | |
Constructors
Time String |
Instances
SimpleType Time Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Time Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Time Source # schemaTypeToXML :: String -> Time -> [Content ()] Source # | |
Show Time Source # | |
Eq Time Source # | |
Constructors
Date String |
Instances
SimpleType Date Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Date Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Date Source # schemaTypeToXML :: String -> Date -> [Content ()] Source # | |
Show Date Source # | |
Eq Date Source # | |
data GYearMonth Source #
Constructors
GYearMonth String |
Instances
SimpleType GYearMonth Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser GYearMonth Source # simpleTypeText :: GYearMonth -> String Source # | |
SchemaType GYearMonth Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser GYearMonth Source # schemaTypeToXML :: String -> GYearMonth -> [Content ()] Source # | |
Show GYearMonth Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> GYearMonth -> ShowS show :: GYearMonth -> String showList :: [GYearMonth] -> ShowS | |
Eq GYearMonth Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes |
Constructors
GYear String |
Instances
SimpleType GYear Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType GYear Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser GYear Source # schemaTypeToXML :: String -> GYear -> [Content ()] Source # | |
Show GYear Source # | |
Eq GYear Source # | |
Constructors
GMonthDay String |
Instances
SimpleType GMonthDay Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser GMonthDay Source # simpleTypeText :: GMonthDay -> String Source # | |
SchemaType GMonthDay Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser GMonthDay Source # schemaTypeToXML :: String -> GMonthDay -> [Content ()] Source # | |
Show GMonthDay Source # | |
Eq GMonthDay Source # | |
Constructors
GDay String |
Instances
SimpleType GDay Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType GDay Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser GDay Source # schemaTypeToXML :: String -> GDay -> [Content ()] Source # | |
Show GDay Source # | |
Eq GDay Source # | |
Constructors
GMonth String |
Instances
SimpleType GMonth Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType GMonth Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser GMonth Source # schemaTypeToXML :: String -> GMonth -> [Content ()] Source # | |
Show GMonth Source # | |
Eq GMonth Source # | |
Derived, yet builtin, datatypes
newtype NormalizedString Source #
Constructors
Normalized String |
Instances
SimpleType NormalizedString Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser NormalizedString Source # simpleTypeText :: NormalizedString -> String Source # | |
SchemaType NormalizedString Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NormalizedString Source # schemaTypeToXML :: String -> NormalizedString -> [Content ()] Source # | |
Show NormalizedString Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> NormalizedString -> ShowS show :: NormalizedString -> String showList :: [NormalizedString] -> ShowS | |
Eq NormalizedString Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods (==) :: NormalizedString -> NormalizedString -> Bool (/=) :: NormalizedString -> NormalizedString -> Bool |
Constructors
Token String |
Instances
SimpleType Token Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Token Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Token Source # schemaTypeToXML :: String -> Token -> [Content ()] Source # | |
Show Token Source # | |
Eq Token Source # | |
Constructors
Language String |
Instances
SimpleType Language Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Language Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Language Source # schemaTypeToXML :: String -> Language -> [Content ()] Source # | |
Show Language Source # | |
Eq Language Source # | |
Constructors
Name String |
Instances
SimpleType Name Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Name Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Name Source # schemaTypeToXML :: String -> Name -> [Content ()] Source # | |
Show Name Source # | |
Eq Name Source # | |
Constructors
NCName String |
Instances
SimpleType NCName Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType NCName Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NCName Source # schemaTypeToXML :: String -> NCName -> [Content ()] Source # | |
Show NCName Source # | |
Eq NCName Source # | |
Constructors
ID String |
Instances
SimpleType ID Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType ID Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser ID Source # schemaTypeToXML :: String -> ID -> [Content ()] Source # | |
Show ID Source # | |
Eq ID Source # | |
Constructors
IDREF String |
Instances
SimpleType IDREF Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType IDREF Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser IDREF Source # schemaTypeToXML :: String -> IDREF -> [Content ()] Source # | |
Show IDREF Source # | |
Eq IDREF Source # | |
Constructors
IDREFS String |
Instances
SimpleType IDREFS Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType IDREFS Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser IDREFS Source # schemaTypeToXML :: String -> IDREFS -> [Content ()] Source # | |
Show IDREFS Source # | |
Eq IDREFS Source # | |
Constructors
ENTITY String |
Instances
SimpleType ENTITY Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType ENTITY Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser ENTITY Source # schemaTypeToXML :: String -> ENTITY -> [Content ()] Source # | |
Show ENTITY Source # | |
Eq ENTITY Source # | |
Constructors
ENTITIES String |
Instances
SimpleType ENTITIES Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType ENTITIES Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser ENTITIES Source # schemaTypeToXML :: String -> ENTITIES -> [Content ()] Source # | |
Show ENTITIES Source # | |
Eq ENTITIES Source # | |
Constructors
NMTOKEN String |
Instances
SimpleType NMTOKEN Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType NMTOKEN Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NMTOKEN Source # schemaTypeToXML :: String -> NMTOKEN -> [Content ()] Source # | |
Show NMTOKEN Source # | |
Eq NMTOKEN Source # | |
Constructors
NMTOKENS String |
Instances
SimpleType NMTOKENS Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType NMTOKENS Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NMTOKENS Source # schemaTypeToXML :: String -> NMTOKENS -> [Content ()] Source # | |
Show NMTOKENS Source # | |
Eq NMTOKENS Source # | |
Instances
SimpleType Integer Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Integer Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Integer Source # schemaTypeToXML :: String -> Integer -> [Content ()] Source # | |
HTypeable Integer Source # | |
XmlContent Integer Source # | |
Data Integer | |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer dataTypeOf :: Integer -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer | |
Bits Integer | |
Defined in GHC.Bits Methods (.&.) :: Integer -> Integer -> Integer (.|.) :: Integer -> Integer -> Integer xor :: Integer -> Integer -> Integer complement :: Integer -> Integer shift :: Integer -> Int -> Integer rotate :: Integer -> Int -> Integer setBit :: Integer -> Int -> Integer clearBit :: Integer -> Int -> Integer complementBit :: Integer -> Int -> Integer testBit :: Integer -> Int -> Bool bitSizeMaybe :: Integer -> Maybe Int shiftL :: Integer -> Int -> Integer unsafeShiftL :: Integer -> Int -> Integer shiftR :: Integer -> Int -> Integer unsafeShiftR :: Integer -> Int -> Integer rotateL :: Integer -> Int -> Integer | |
Enum Integer | |
Defined in GHC.Enum | |
Ix Integer | |
Num Integer | |
Read Integer | |
Integral Integer | |
Defined in GHC.Real | |
Real Integer | |
Defined in GHC.Real Methods toRational :: Integer -> Rational | |
Show Integer | |
PrintfArg Integer | |
Defined in Text.Printf | |
Eq Integer | |
Ord Integer | |
Parse Integer | |
Defined in Text.Parse Methods parse :: TextParser Integer # parsePrec :: Int -> TextParser Integer # parseList :: TextParser [Integer] # | |
Parse Integer | |
Pretty Integer | |
Defined in Text.PrettyPrint.Annotated.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Integer -> Doc ann pPrintList :: PrettyLevel -> [Integer] -> Doc ann | |
Pretty Integer | |
Defined in Text.PrettyPrint.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Integer -> Doc pPrintList :: PrettyLevel -> [Integer] -> Doc | |
Random Integer | |
UniformRange Integer | |
Defined in System.Random.Internal |
newtype NonPositiveInteger Source #
Instances
SimpleType NonPositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser NonPositiveInteger Source # simpleTypeText :: NonPositiveInteger -> String Source # | |
SchemaType NonPositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NonPositiveInteger Source # schemaTypeToXML :: String -> NonPositiveInteger -> [Content ()] Source # | |
Show NonPositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> NonPositiveInteger -> ShowS show :: NonPositiveInteger -> String showList :: [NonPositiveInteger] -> ShowS | |
Eq NonPositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods (==) :: NonPositiveInteger -> NonPositiveInteger -> Bool (/=) :: NonPositiveInteger -> NonPositiveInteger -> Bool |
newtype NegativeInteger Source #
Instances
SimpleType NegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser NegativeInteger Source # simpleTypeText :: NegativeInteger -> String Source # | |
SchemaType NegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NegativeInteger Source # schemaTypeToXML :: String -> NegativeInteger -> [Content ()] Source # | |
Show NegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> NegativeInteger -> ShowS show :: NegativeInteger -> String showList :: [NegativeInteger] -> ShowS | |
Eq NegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods (==) :: NegativeInteger -> NegativeInteger -> Bool (/=) :: NegativeInteger -> NegativeInteger -> Bool |
Constructors
Long Int64 |
Instances
SimpleType Long Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Long Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Long Source # schemaTypeToXML :: String -> Long -> [Content ()] Source # | |
Show Long Source # | |
Eq Long Source # | |
Instances
SimpleType Int Source # | |||||
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |||||
SchemaType Int Source # | |||||
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Int Source # schemaTypeToXML :: String -> Int -> [Content ()] Source # | |||||
HTypeable Int Source # | |||||
XmlContent Int Source # | |||||
Data Int | |||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int dataTypeOf :: Int -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) gmapT :: (forall b. Data b => b -> b) -> Int -> Int gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int | |||||
Storable Int | |||||
Bits Int | |||||
Defined in GHC.Bits Methods complement :: Int -> Int complementBit :: Int -> Int -> Int bitSizeMaybe :: Int -> Maybe Int unsafeShiftL :: Int -> Int -> Int unsafeShiftR :: Int -> Int -> Int | |||||
FiniteBits Int | |||||
Defined in GHC.Bits | |||||
Bounded Int | |||||
Enum Int | |||||
Ix Int | |||||
Num Int | |||||
Read Int | |||||
Integral Int | |||||
Real Int | |||||
Defined in GHC.Real Methods toRational :: Int -> Rational | |||||
Show Int | |||||
PrintfArg Int | |||||
Defined in Text.Printf | |||||
Eq Int | |||||
Ord Int | |||||
Parse Int | |||||
Defined in Text.Parse | |||||
Parse Int | |||||
Pretty Int | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass Methods pPrintPrec :: PrettyLevel -> Rational -> Int -> Doc ann pPrintList :: PrettyLevel -> [Int] -> Doc ann | |||||
Pretty Int | |||||
Defined in Text.PrettyPrint.HughesPJClass | |||||
Random Int | |||||
Uniform Int | |||||
Defined in System.Random.Internal | |||||
UniformRange Int | |||||
Defined in System.Random.Internal | |||||
Generic1 (URec Int :: k -> Type) | |||||
Defined in GHC.Generics Associated Types
| |||||
Foldable (UInt :: Type -> Type) | |||||
Defined in Data.Foldable Methods fold :: Monoid m => UInt m -> m foldMap :: Monoid m => (a -> m) -> UInt a -> m foldMap' :: Monoid m => (a -> m) -> UInt a -> m foldr :: (a -> b -> b) -> b -> UInt a -> b foldr' :: (a -> b -> b) -> b -> UInt a -> b foldl :: (b -> a -> b) -> b -> UInt a -> b foldl' :: (b -> a -> b) -> b -> UInt a -> b foldr1 :: (a -> a -> a) -> UInt a -> a foldl1 :: (a -> a -> a) -> UInt a -> a toList :: UInt a -> [a] null :: UInt a -> Bool elem :: Eq a => a -> UInt a -> Bool maximum :: Ord a => UInt a -> a minimum :: Ord a => UInt a -> a sum :: Num a => UInt a -> a product :: Num a => UInt a -> a | |||||
Traversable (UInt :: Type -> Type) | |||||
Defined in Data.Traversable Methods traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) sequenceA :: Applicative f => UInt (f a) -> f (UInt a) mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) sequence :: Monad m => UInt (m a) -> m (UInt a) | |||||
Functor (URec Int :: Type -> Type) | |||||
Generic (URec Int p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Int p) | |||||
Eq (URec Int p) | |||||
Ord (URec Int p) | |||||
data URec Int (p :: k) | |||||
Defined in GHC.Generics | |||||
type Rep1 (URec Int :: k -> Type) | |||||
Defined in GHC.Generics type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type))) | |||||
type Rep (URec Int p) | |||||
Defined in GHC.Generics type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type))) |
Constructors
Short Int16 |
Instances
SimpleType Short Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Short Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Short Source # schemaTypeToXML :: String -> Short -> [Content ()] Source # | |
Show Short Source # | |
Eq Short Source # | |
Constructors
Byte Int8 |
Instances
SimpleType Byte Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes | |
SchemaType Byte Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser Byte Source # schemaTypeToXML :: String -> Byte -> [Content ()] Source # | |
Show Byte Source # | |
Eq Byte Source # | |
newtype NonNegativeInteger Source #
Instances
SimpleType NonNegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser NonNegativeInteger Source # simpleTypeText :: NonNegativeInteger -> String Source # | |
SchemaType NonNegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser NonNegativeInteger Source # schemaTypeToXML :: String -> NonNegativeInteger -> [Content ()] Source # | |
Show NonNegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> NonNegativeInteger -> ShowS show :: NonNegativeInteger -> String showList :: [NonNegativeInteger] -> ShowS | |
Eq NonNegativeInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods (==) :: NonNegativeInteger -> NonNegativeInteger -> Bool (/=) :: NonNegativeInteger -> NonNegativeInteger -> Bool |
newtype UnsignedLong Source #
Constructors
ULong Word64 |
Instances
SimpleType UnsignedLong Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser UnsignedLong Source # simpleTypeText :: UnsignedLong -> String Source # | |
SchemaType UnsignedLong Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser UnsignedLong Source # schemaTypeToXML :: String -> UnsignedLong -> [Content ()] Source # | |
Show UnsignedLong Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> UnsignedLong -> ShowS show :: UnsignedLong -> String showList :: [UnsignedLong] -> ShowS | |
Eq UnsignedLong Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes |
newtype UnsignedInt Source #
Constructors
UInt Word32 |
Instances
SimpleType UnsignedInt Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser UnsignedInt Source # simpleTypeText :: UnsignedInt -> String Source # | |
SchemaType UnsignedInt Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser UnsignedInt Source # schemaTypeToXML :: String -> UnsignedInt -> [Content ()] Source # | |
Show UnsignedInt Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> UnsignedInt -> ShowS show :: UnsignedInt -> String showList :: [UnsignedInt] -> ShowS | |
Eq UnsignedInt Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes |
newtype UnsignedShort Source #
Constructors
UShort Word16 |
Instances
SimpleType UnsignedShort Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser UnsignedShort Source # simpleTypeText :: UnsignedShort -> String Source # | |
SchemaType UnsignedShort Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser UnsignedShort Source # schemaTypeToXML :: String -> UnsignedShort -> [Content ()] Source # | |
Show UnsignedShort Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> UnsignedShort -> ShowS show :: UnsignedShort -> String showList :: [UnsignedShort] -> ShowS | |
Eq UnsignedShort Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes |
newtype UnsignedByte Source #
Constructors
UByte Word8 |
Instances
SimpleType UnsignedByte Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser UnsignedByte Source # simpleTypeText :: UnsignedByte -> String Source # | |
SchemaType UnsignedByte Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser UnsignedByte Source # schemaTypeToXML :: String -> UnsignedByte -> [Content ()] Source # | |
Show UnsignedByte Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> UnsignedByte -> ShowS show :: UnsignedByte -> String showList :: [UnsignedByte] -> ShowS | |
Eq UnsignedByte Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes |
newtype PositiveInteger Source #
Instances
SimpleType PositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods acceptingParser :: TextParser PositiveInteger Source # simpleTypeText :: PositiveInteger -> String Source # | |
SchemaType PositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.Schema Methods parseSchemaType :: String -> XMLParser PositiveInteger Source # schemaTypeToXML :: String -> PositiveInteger -> [Content ()] Source # | |
Show PositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods showsPrec :: Int -> PositiveInteger -> ShowS show :: PositiveInteger -> String showList :: [PositiveInteger] -> ShowS | |
Eq PositiveInteger Source # | |
Defined in Text.XML.HaXml.Schema.PrimitiveTypes Methods (==) :: PositiveInteger -> PositiveInteger -> Bool (/=) :: PositiveInteger -> PositiveInteger -> Bool |