-- ------------------------------------------------------------

{- |
   Module     : Text.XML.HXT.XMLSchema.DataTypeLibW3C
   Copyright  : Copyright (C) 2005-2010 Uwe Schmidt
   License    : MIT

   Maintainer : Uwe Schmidt (uwe@fh-wedel.de)
   Stability  : experimental
   Portability: portable
   Version    : $Id$

   Datatype library for the W3C XML schema datatypes

-}

-- ------------------------------------------------------------

module Text.XML.HXT.XMLSchema.DataTypeLibW3CNames
where

-- ------------------------------------------------------------

-- | Namespace of the W3C XML schema datatype library

w3cNS   :: String
w3cNS :: String
w3cNS   = String
"http://www.w3.org/2001/XMLSchema-datatypes"

xsd_string
 , xsd_normalizedString
 , xsd_token
 , xsd_language
 , xsd_NMTOKEN
 , xsd_NMTOKENS
 , xsd_Name
 , xsd_NCName
 , xsd_ID
 , xsd_IDREF
 , xsd_IDREFS
 , xsd_ENTITY
 , xsd_ENTITIES
 , xsd_anyURI
 , xsd_QName
 , xsd_NOTATION
 , xsd_hexBinary
 , xsd_base64Binary
 , xsd_decimal
 , xsd_integer
 , xsd_nonPositiveInteger
 , xsd_negativeInteger
 , xsd_nonNegativeInteger
 , xsd_positiveInteger
 , xsd_long
 , xsd_int
 , xsd_short
 , xsd_byte
 , xsd_unsignedLong
 , xsd_unsignedInt
 , xsd_unsignedShort
 , xsd_unsignedByte

 , xsd_boolean
 , xsd_float
 , xsd_double
 , xsd_time
 , xsd_duration
 , xsd_date
 , xsd_dateTime
 , xsd_gDay
 , xsd_gMonth
 , xsd_gMonthDay
 , xsd_gYear
 , xsd_gYearMonth :: String

xsd_string :: String
xsd_string              = String
"string"
xsd_normalizedString :: String
xsd_normalizedString    = String
"normalizedString"
xsd_token :: String
xsd_token               = String
"token"
xsd_language :: String
xsd_language            = String
"language"
xsd_NMTOKEN :: String
xsd_NMTOKEN             = String
"NMTOKEN"
xsd_NMTOKENS :: String
xsd_NMTOKENS            = String
"NMTOKENS"
xsd_Name :: String
xsd_Name                = String
"Name"
xsd_NCName :: String
xsd_NCName              = String
"NCName"
xsd_ID :: String
xsd_ID                  = String
"ID"
xsd_IDREF :: String
xsd_IDREF               = String
"IDREF"
xsd_IDREFS :: String
xsd_IDREFS              = String
"IDREFS"
xsd_ENTITY :: String
xsd_ENTITY              = String
"ENTITY"
xsd_ENTITIES :: String
xsd_ENTITIES            = String
"ENTITIES"
xsd_anyURI :: String
xsd_anyURI              = String
"anyURI"
xsd_QName :: String
xsd_QName               = String
"QName"
xsd_NOTATION :: String
xsd_NOTATION            = String
"NOTATION"
xsd_hexBinary :: String
xsd_hexBinary           = String
"hexBinary"
xsd_base64Binary :: String
xsd_base64Binary        = String
"base64Binary"
xsd_decimal :: String
xsd_decimal             = String
"decimal"
xsd_integer :: String
xsd_integer             = String
"integer"
xsd_nonPositiveInteger :: String
xsd_nonPositiveInteger  = String
"nonPositiveInteger"
xsd_negativeInteger :: String
xsd_negativeInteger     = String
"negativeInteger"
xsd_nonNegativeInteger :: String
xsd_nonNegativeInteger  = String
"nonNegativeInteger"
xsd_positiveInteger :: String
xsd_positiveInteger     = String
"positiveInteger"
xsd_long :: String
xsd_long                = String
"long"
xsd_int :: String
xsd_int                 = String
"int"
xsd_short :: String
xsd_short               = String
"short"
xsd_byte :: String
xsd_byte                = String
"byte"
xsd_unsignedLong :: String
xsd_unsignedLong        = String
"unsignedLong"
xsd_unsignedInt :: String
xsd_unsignedInt         = String
"unsignedInt"
xsd_unsignedShort :: String
xsd_unsignedShort       = String
"unsignedShort"
xsd_unsignedByte :: String
xsd_unsignedByte        = String
"unsignedByte"

xsd_boolean :: String
xsd_boolean             = String
"boolean"
xsd_float :: String
xsd_float               = String
"float"
xsd_double :: String
xsd_double              = String
"double"
xsd_time :: String
xsd_time                = String
"time"
xsd_duration :: String
xsd_duration            = String
"duration"
xsd_date :: String
xsd_date                = String
"date"
xsd_dateTime :: String
xsd_dateTime            = String
"dateTime"
xsd_gDay :: String
xsd_gDay                = String
"gDay"
xsd_gMonth :: String
xsd_gMonth              = String
"gMonth"
xsd_gMonthDay :: String
xsd_gMonthDay           = String
"gMonthDay"
xsd_gYear :: String
xsd_gYear               = String
"gYear"
xsd_gYearMonth :: String
xsd_gYearMonth          = String
"gYearMonth"

xsd_length
 , xsd_maxLength
 , xsd_minLength
 , xsd_maxExclusive
 , xsd_minExclusive
 , xsd_maxInclusive
 , xsd_minInclusive
 , xsd_totalDigits
 , xsd_fractionDigits
 , xsd_pattern
 , xsd_enumeration
 , xsd_whiteSpace :: String

xsd_length :: String
xsd_length              = String
"length"
xsd_maxLength :: String
xsd_maxLength           = String
"maxLength"
xsd_minLength :: String
xsd_minLength           = String
"minLength"

xsd_maxExclusive :: String
xsd_maxExclusive        = String
"maxExclusive"
xsd_minExclusive :: String
xsd_minExclusive        = String
"minExclusive"
xsd_maxInclusive :: String
xsd_maxInclusive        = String
"maxInclusive"
xsd_minInclusive :: String
xsd_minInclusive        = String
"minInclusive"

xsd_totalDigits :: String
xsd_totalDigits         = String
"totalDigits"
xsd_fractionDigits :: String
xsd_fractionDigits      = String
"fractionDigits"

xsd_pattern :: String
xsd_pattern             = String
"pattern"
xsd_enumeration :: String
xsd_enumeration         = String
"enumeration"

xsd_whiteSpace :: String
xsd_whiteSpace          = String
"whiteSpace"

-- ----------------------------------------