h&خ      !"#$%&'()*+,-./0123456789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ % % % % % & & & & & ' ' ' ' ' ' ' ' ' ' ' ' ' ' ' ' ( ( ( ( ( ( ( ( ((((((())))))))))))))))))))))))))************+++ Safe-Inferred'HaXmlString holds default value. HaXmlNon-empty lists. HaXmlXML's contentspec allows ANYHaXmlmixed (#PCDATA | ... )*HaXmlstring only (#PCDATA)HaXmlBool for main/aux.HaXml9Need to keep both the XML and Haskell versions of a name.HaXmloriginal XML nameHaXmlmangled Haskell nameHaXmlPretty print Haskell name.HaXmlPretty print XML name.HaXml%Pretty print Haskell attributes name.HaXml/Make a type name valid in both XML and Haskell.HaXml8Append an underscore to the Haskell version of the name. HaXmlPrefix an attribute enumeration type name with its containing element name.!HaXmlPrefix an attribute enumeration constructor with its element-tag name, and its enumeration type name."HaXml4Prefix a field name with its enclosing element name.#HaXml'Convert an XML name to a Haskell conid.HaXmlEnsure a generated name does not conflict with a standard haskell one.$HaXml'Convert an XML name to a Haskell varid.HaXml-Convert colon to prime, hyphen to underscore.    !"#$    !"#$ Safe-Inferred()HaXmlDHaXmlFHaXmlHHaXmlCDATA INCLUDE IGNORE etcIHaXmlMHaXml?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcde/cdebABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`a;<=>?@789: Safe-Inferred4e~HaXmlNamespaces are not defined in the XML spec itself, but at http://www.w3.org/TR/xml-namesHaXmlA QName is a (possibly) qualified name, in the sense of XML namespaces.HaXmlJust OneHaXml Zero Or OneHaXml Zero Or MoreHaXml One Or MoreHaXml)bool is whether whitespace is significantHaXmlThe symbol table stored in a document holds all its general entity reference definitions.mnopqrstuvwxyz{|}~xyvwstuqrop~}|{znm  Safe-Inferred7HaXmlThis instance is pretty unsatisfactory, and is useful only for building environments involving recursive modules. The mappend! method is left-biased, and the mempty* value contains lots of undefined values. Safe-Inferred=!HaXmlUltimately, 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.  Safe-InferredG HaXml'The null Namespace (no prefix, no URI).HaXmlEvery Name can be split into a Namespace and local Name. The Namespace might of course be missing.HaXml;Return the (possibly absent) Namespace component of a Name.HaXmlRemove any prefix directory names, and given suffix extension.  Safe-InferredM  Safe-InferredRHaXmlA concrete representation of any user-defined Haskell constructor. The constructor has a name, and a sequence of component types. The first sequence of types represents the minimum set of free type variables occurring in the (second) list of real component types. If there are fieldnames, they are contained in the final list, and correspond one-to-one with the component types.HaXml.A concrete representation of any Haskell type.HaXml"separate Haskell name and XML nameHaXmlA user-defined type has a name, a sequence of type variables, and a set of constructors. (The variables might already be instantiated to actual types.)HaXml HTypeable promises that we can create an explicit representation of of the type of any value.HaXmlProject the n'th constructor from an HType and convert it to a string suitable for an XML tagname.HaXml converts a concrete representation of the Haskell type of a value (obtained by the method ) into a real DocTypeDecl. It ensures that PERefs are defined before they are used, and that no element or attribute-list is declared more than once. Safe-Inferred[~HaXml=XParser is just a specialisation of the PolyStateLazy parser.HaXmlTo parse a whole document, xmlParse file content takes a filename (for generating error reports) and the string content of that file. A parse error causes program failure, with message to stderr.HaXmlTo parse just a DTD, dtdParse file content takes a filename (for generating error reports) and the string content of that file. If no DTD was found, you get Nothing rather than an error. However, if a DTD is found but contains errors, the program crashes.HaXmlTo parse a partial document, e.g. from an XML-based stream protocol, where you may later want to get more document elements from the same stream. Arguments are: a parser for the item you want, and the already-lexed input to parse from. Returns the item you wanted (or an error message), plus the remainder of the input.HaXml2Some empty symbol tables for GE and PE references.HaXmlReturn the next token from the input only if it matches the given token.HaXmlReturn a qualified name (although the namespace qualification is not processed here; this is merely to get the correct type).HaXml6Return just a name, e.g. element name, attribute name.HaXmlReturn an entire XML document including prolog and trailing junk.HaXmlReturn an XML comment.HaXmlParse a processing instruction.HaXml(Return a DOCTYPE decl, indicating a DTD.HaXml4Return a DTD markup decl, e.g. ELEMENT, ATTLIST, etcHaXml:Return a complete element including all its inner content.HaXml>Parse only the parts between angle brackets in an element tag.HaXmlFor use with stream parsers - returns the complete opening element tag.HaXmlFor use with stream parsers - accepts a closing tag, provided it matches the given element name.HaXml=Return a content particle, e.g. text, element, reference, etcHaXmlReturn either a general entity reference, or a character reference.HaXml3Return parsed freetext (i.e. until the next markup) Safe-InferredfeHaXml9XParser is just a specialisation of the PolyState parser.HaXmlTo parse a whole document, xmlParse file content takes a filename (for generating error reports) and the string content of that file. A parse error causes program failure, with message to stderr.HaXmlTo parse just a DTD, dtdParse file content takes a filename (for generating error reports) and the string content of that file. If no DTD was found, you get Nothing rather than an error. However, if a DTD is found but contains errors, the program crashes.HaXmlTo parse a whole document, xmlParse' file content takes a filename (for generating error reports) and the string content of that file. Any parse error message is passed back to the caller through the Either type.HaXmlTo parse just a DTD, dtdParse' file content takes a filename (for generating error reports) and the string content of that file. If no DTD was found, you get  Right Nothing7. If a DTD was found but contains errors, you get a  Left message.HaXmlTo parse a partial document, e.g. from an XML-based stream protocol, where you may later want to get more document elements from the same stream. Arguments are: a parser for the item you want, and the already-lexed input to parse from. Returns the item you wanted (or an error message), plus the remainder of the input.HaXml2Some empty symbol tables for GE and PE references.HaXmlReturn the next token from the input only if it matches the given token.HaXmlReturn a qualified name (although the namespace qualification is not processed here; this is merely to get the correct type).HaXml6Return just a name, e.g. element name, attribute name.HaXmlReturn an entire XML document including prolog and trailing junk.HaXmlReturn an XML comment.HaXmlParse a processing instruction.HaXml(Return a DOCTYPE decl, indicating a DTD.HaXml4Return a DTD markup decl, e.g. ELEMENT, ATTLIST, etcHaXml:Return a complete element including all its inner content.HaXml>Parse only the parts between angle brackets in an element tag.HaXmlFor use with stream parsers - returns the complete opening element tag.HaXmlFor use with stream parsers - accepts a closing tag, provided it matches the given element name.HaXml=Return a content particle, e.g. text, element, reference, etcHaXmlReturn either a general entity reference, or a character reference.HaXml3Return parsed freetext (i.e. until the next markup) Safe-Inferredj HaXml)A doctype declaration occured()HaXml'A processing instruction occured ()HaXmlA comment occured ()HaXmlAn element was opened (<>)HaXmlAn element was closed ()HaXml(An element without content occured ()HaXmlSome string data occuredHaXmlA reference occuredHaXmlsaxParse file content takes a filename and the string content of that file and generates a stream of  SaxElements. If an error occurs, the parsing stops and a string is returned using the Maybe type.HaXml The filenameHaXmlThe content of the fileHaXml#A tuple of the parsed elements and Nothing, if no error occured, or Just String if an error occured.   Safe-InferredjV Safe-InferredkwHaXmlThe first argument is the name of the file, the second is the string contents of the file. The result is the generic representation of an XML document. Any errors cause program failure with message to stderr. Safe-InferredmtHaXmlThe first argument is the name of the file, the second is the string contents of the file. The result is the generic representation of an XML document. Any errors cause program failure with message to stderr.HaXmlThe first argument is the name of the file, the second is the string contents of the file. The result is the generic representation of an XML document. Any parsing errors are returned in the Either type. Safe-Inferredm Safe-Inferredm Safe-Inferred*HaXmlA LabelFilter is like a CFilter except that it pairs up a polymorphic value (label) with each of its results.HaXml*Conjoin the two branches of a conditional.HaXml!All document transformations are content filters!. A filter takes a single XML $ value and returns a sequence of  values, possibly empty.HaXml>Throw away current node, keep just the (unprocessed) children.HaXml Select the n"'th positional result of a filter.HaXml!For a mandatory attribute field,  find key cont- looks up the value of the attribute name key, and applies the continuation cont to the value.HaXml+When an attribute field may be absent, use iffind key yes no to lookup its value. If the attribute is absent, it acts as the no% filter, otherwise it applies the yes filter.HaXml ifTxt yes no( processes any textual content with the yes- filter, but otherwise is the same as the no filter.HaXml8Select between the two branches of a joined conditional.HaXml Sequential (Irish, backwards ) compositionHaXmlBinary parallel composition. Each filter uses a copy of the input, rather than one filter using the result of the other. (Has a more general type than just CFilter.)HaXmlGlue a list of filters together. (A list version of union; also has a more general type than just CFilter.)HaXmlA special form of filter composition where the second filter works over the same data as the first, but also uses the first's result.HaXml)Process children using specified filters.HaXmlDirectional choice: in f |>| g, give g-productions only if no f-productionsHaXml Pruning: in f  g, keep only those f-productions which have at least one g-productionHaXml Pruning: in f  g>, keep only those f-productions which have no g-productionsHaXml Pronounced slash, f /> g means g inside fHaXml Pronounced outside, f Build an element with the given name, attributes, and content.HaXmlBuild some textual content.HaXmlBuild some CDATA content.HaXml4Rename an element tag (leaving attributes in place).HaXml subtypes HaXmlsubstitution groups HaXmlwhere type is defined HaXml*An empty environment of XSD type mappings. HaXmlCombine two environments (e.g. read from different interface files) HaXml?Build an environment of XSD type mappings from a schema module. HaXml$Find all direct module dependencies.  ( Safe-Inferred HaXmlTransform a Schema by lifting all locally-defined anonymous types to the top-level, naming them, and planting a referend at their original location. HaXmlGiven an environment of schema type mappings, and a schema module, create a bunch of Decls that describe the types in a more Haskell-friendly way. HaXml:Consolidate a Facet occurrence into a single Occurs value.HaXml6Push another Occurs value inside an existing Modifier.HaXmlConvert an occurs range to a Haskell-style type modifier (Maybe, List, Id)HaXml7Find the supertype (if it exists) of a given type name.HaXmlKeep applying the function to transform the value, until it yields Nothing. Returns the sequence of transformed values.  ) Safe-InferredHaXml?@ABCDEFGHIJJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~J                                C   / .                                                                                       A A                                                                                                                                                                                   JJ[                                            ; = ?  C D                                 QQ>< !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! ! " " " " " " "" " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " " # # # # ## # # # ## # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # # ##Q$ $ $$$ $$ $$$$$ $ $ $ $$$@$ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $ $$$ $ $ $ $ $ $ $ $ $ $ $ $ $$ $ $ $$$ $ $$$ $ % % % % % & & & & & ' ' ' ' ' ' ' ' ' ' ' ' ' ' ' ' ( ( (( ( ( ( ( ( ( ( ( ( ( ( ) ) ) ) ) ) ) ))))))))))) ))))))))*t* * * *]* ** *h***i+ +   4 4  4 4 4 4 4 4  4  4 4  4  4 4  4  4 4 4  4  4 4 4 4  4 4 4 4 4 4 4                  4 4 %N%O% % % % % % % % % % % % % % % % % % & &N&O& & & & & & & & & & & & & & & & & & & & & & & + #HaXml-1.25.13-OjusmBLvx9Hz0YCGHArAb$Text.XML.HaXml.Schema.PrimitiveTypes Text.XML.HaXml.XmlContent.ParserText.XML.HaXml#Text.XML.HaXml.DtdToHaskell.TypeDef$Text.XML.HaXml.DtdToHaskell.InstanceText.XML.HaXml.PosnText.XML.HaXml.LexText.XML.HaXml.Types"Text.XML.HaXml.Schema.XSDTypeModelText.XML.HaXml.Namespaces$Text.XML.HaXml.Schema.NameConversionText.XML.HaXml.PrettyText.XML.HaXml.TypeMappingText.XML.HaXml.ParseLazyText.XML.HaXml.ParseText.XML.HaXml.SAXText.XML.HaXml.Html.PrettyText.XML.HaXml.Html.ParseLazyText.XML.HaXml.Html.ParseText.XML.HaXml.Escape#Text.XML.HaXml.DtdToHaskell.ConvertText.XML.HaXml.CombinatorsText.XML.HaXml.Html.GenerateText.XML.HaXml.ByteStringPPText.XML.HaXml.VerbatimText.XML.HaXml.UtilText.XML.HaXml.VersionText.XML.HaXml.Wrappers!Text.XML.HaXml.XmlContent.HaskellText.XML.HaXml.XmlContentText.XML.HaXml.ValidateText.XML.HaXml.ShowXmlLazyText.XML.HaXml.OneOfNText.XML.HaXml.Schema.SchemaText.XML.HaXml.Schema.Parse&Text.XML.HaXml.Schema.HaskellTypeModel"Text.XML.HaXml.Schema.PrettyHsBoot#Text.XML.HaXml.Schema.PrettyHaskell!Text.XML.HaXml.Schema.Environment$Text.XML.HaXml.Schema.TypeConversion!Text.XML.HaXml.Xtract.CombinatorsText.XML.HaXml.Xtract.LexText.XML.HaXml.Xtract.Parseghc-prim GHC.TypesDoubleFloatInt ghc-bignumGHC.Num.IntegerIntegerbase Data.Maybe catMaybespretty-1.1.3.6Text.PrettyPrint.HughesPJrender StructTypeMaybe DefaultableListList1TupleOneOfAny StringMixedStringDefined AttrFields ConstructorsTypeDefDataDefEnumDefNamexNamehName ppTypeDefppHNameppXNameppANamenamename_name_aname_acname_fmanglemanglef$fShowStructType $fEqTypeDef$fEqStructType$fEqName mkInstancePosn posnFilenameposnLine posnColumnnoPos posInNewCxtforcepaddcolnewlinetabwhite $fShowPosn$fEqPosnSectionCDATAxINCLUDExIGNORExSpecialDOCTYPExELEMENTxATTLISTxENTITYx NOTATIONxTokenTTokCommentOpenTokCommentClose TokPIOpen TokPICloseTokSectionOpenTokSectionClose TokSectionTokSpecialOpen TokSpecial TokEndOpen TokEndClose TokAnyOpen TokAnyClose TokSqOpen TokSqCloseTokEqualTokQueryTokStarTokPlusTokAmpTokSemiTokHash TokBraOpen TokBraCloseTokPipe TokPercentTokCommaTokQuoteTokName TokFreeTextTokNullTokErrorTokenxmlLexxmlReLexreLexEntityValue $fShowTokenT $fEqTokenT $fEqSection $fShowSection $fEqSpecial $fShowSpecial $fEqWhereCDSectCharData SystemLiteral PubidLiteralEVEVStringEVRef EntityValueAttValueNmTokensNmTokenNames NamespacensPrefixnsURIQNameNQN EncodingDeclPublicIDPUBLICID NotationDeclNOTATIONExtPE ExtParsedEntTextDecl NDataDeclNDATA ExternalIDSYSTEMPUBLICPEDefPEDefEntityValuePEDefExternalID EntityDefDefEntityValue DefExternalIDPEDeclGEDecl EntityDecl EntityGEDecl EntityPEDecl PEReferenceCharRef EntityRef Reference RefEntityRefCharIgnoreSectContentsIgnore IgnoreSect IncludeSectConditionalSectFIXED DefaultDeclREQUIREDIMPLIED DefaultTo Enumeration NotationTypeEnumeratedType TokenizedTypeIDIDREFIDREFSENTITYENTITIESNMTOKENNMTOKENSAttType StringTypeAttDef AttListDeclMixedPCDATA PCDATAplusModifierNoneQueryStarPlusCPTagNameChoiceSeq ContentSpecEMPTYANY ElementDeclContentCElemCStringCRefCMisc AttributeElemTagElementElem ExtSubsetDecl ExtMarkupDeclExtConditionalSect ExtSubset MarkupDeclAttListEntityNotation MarkupMisc DocTypeDeclDTDPITargetComment VersionInfoSDDeclProcessingInstructionMiscPIXMLDeclPrologDocumentSymTabemptySTaddSTlookupSTinfo $fEqNamespace $fOrdQName$fShowAttValue $fEqElemTag$fFunctorContent$fFunctorElement $fEqContent$fFunctorDocument $fEqDocument$fShowDocument$fEqExtParsedEnt$fShowExtParsedEnt $fShowContent $fEqElement $fShowElement $fEqProlog $fShowProlog$fEqDocTypeDecl$fShowDocTypeDecl $fEqExtSubset$fShowExtSubset $fEqExtPE $fShowExtPE$fEqExtSubsetDecl$fShowExtSubsetDecl$fEqConditionalSect$fShowConditionalSect$fEqMarkupDecl$fShowMarkupDecl$fEqEntityDecl$fShowEntityDecl $fEqGEDecl $fShowGEDecl $fEqEntityDef$fShowEntityDef $fEqPEDecl $fShowPEDecl $fEqPEDef $fShowPEDef$fEqNotationDecl$fShowNotationDecl$fEqExternalID$fShowExternalID$fEqSystemLiteral$fShowSystemLiteral $fEqPublicID$fShowPublicID$fEqPubidLiteral$fShowPubidLiteral$fEqEntityValue$fShowEntityValue$fEqEV$fShowEV$fEqAttListDecl$fShowAttListDecl $fEqAttDef $fShowAttDef$fEqDefaultDecl$fShowDefaultDecl $fEqAttValue $fEqAttType $fShowAttType$fEqEnumeratedType$fShowEnumeratedType $fEqReference$fShowReference $fEqNDataDecl$fShowNDataDecl$fEqElementDecl$fShowElementDecl$fEqContentSpec$fShowContentSpec$fEqCP$fShowCP $fEqMixed $fShowMixed $fEqQName $fShowQName$fShowNamespace $fEqXMLDecl $fShowXMLDecl $fEqTextDecl$fShowTextDecl$fEqEncodingDecl$fShowEncodingDecl$fEqIgnoreSectContents$fShowIgnoreSectContents $fEqIgnore $fShowIgnore $fEqFIXED $fShowFIXED$fEqTokenizedType$fShowTokenizedType $fEqModifier$fShowModifier$fEqMisc $fShowMiscTypeNameURIRegexp FixedValue DefaultValueSchemaLocationProcessContentsSkipLaxStrictBlockFinal NoExtension NoRestrictionAllFinalTargetNamespaceQForm Qualified Unqualified Annotation DocumentationAppInfo NoAnnotationFixedNillable MyRestrictionRangePattern PrimitiveTypeBooleanDecimalDurationDateTimeTimeDate GYearMonthGYear GMonthDayGDayGMonth Base64Binary HexBinaryAnyURIUseRequiredOptional ProhibitedOccursFieldfield_annotation field_xpathSelectorselector_annotationselector_xpathKeyRefkeyref_annotation keyref_name keyref_referkeyref_selector keyref_fieldsKeykey_annotationkey_name key_selector key_fieldsUniqueunique_annotation unique_nameunique_selector unique_fieldsUniqueKeyOrKeyRefUKKR AttributeDeclattr_annotationattr_nameOrRefattr_use attr_defFixed attr_formattr_simpleType NameAndTypeNTtheNametheTypeelem_annotationelem_nameOrRef elem_occurs elem_nillableelem_substGroup elem_abstract elem_final elem_block elem_form elem_content elem_stuff AttrGroupattrgroup_annotationattrgroup_nameOrRefattrgroup_stuffAnyAttranyattr_annotationanyattr_namespaceanyattr_processContentsany_annotation any_namespaceany_processContents any_occurs ElementEtc HasElementHasGroupHasCSHasAny ChoiceOrSeqAllSequenceGroupgroup_annotationgroup_nameOrRef group_occurs group_stuff ParticleAttrsPAParticle Extensionextension_annotationextension_baseextension_newstuff Restriction1 ComplexItem SimpleContentComplexContentThisType ci_annotationci_stuffci_mixed ci_thistype ComplexTypecomplex_annotation complex_namecomplex_abstract complex_final complex_block complex_mixedcomplex_content FacetTypeOrderedBoundsMinInclOrderedBoundsMinExclOrderedBoundsMaxInclOrderedBoundsMaxExclOrderedNumericTotalDigitsOrderedNumericFractionDigitsUnorderedPatternUnorderedEnumerationUnorderedWhitespaceUnorderedLengthUnorderedMaxLengthUnorderedMinLengthFacetfacet_facetTypefacet_annotationfacet_facetValue facet_fixed Restriction RestrictSim1 RestrictTyperestrict_annotation restrict_base restrict_r1 restrict_typerestrict_facets SimpleType Primitive RestrictedListOfUnionOfsimple_primitivesimple_annotation simple_name simple_finalsimple_restriction simple_type simple_unionsimple_members SchemaItemIncludeImportRedefineSimpleComplex SchemaElementSchemaAttributeAttributeGroup SchemaGroupSchemaschema_elementFormDefaultschema_attributeFormDefaultschema_finalDefaultschema_blockDefaultschema_targetNamespaceschema_versionschema_namespaces schema_items$fSemigroupAnnotation$fMonoidAnnotation$fSemigroupSchema$fMonoidSchema $fEqSchema $fShowSchema$fEqSchemaItem$fShowSchemaItem$fEqElementEtc$fShowElementEtc$fEqComplexType$fShowComplexType$fEqComplexItem$fShowComplexItem$fEqParticleAttrs$fShowParticleAttrs$fEqAttributeDecl$fShowAttributeDecl$fEqSimpleType$fShowSimpleType$fEqRestriction$fShowRestriction$fEqRestriction1$fShowRestriction1$fEqChoiceOrSeq$fShowChoiceOrSeq $fEqGroup $fShowGroup $fEqAttrGroup$fShowAttrGroup $fEqExtension$fShowExtension$fEqAny $fShowAny $fEqAnyAttr $fShowAnyAttr$fEqMyRestriction$fShowMyRestriction$fEqProcessContents$fShowProcessContents $fEqFinal $fShowFinal $fEqQForm $fShowQForm $fEqFacet $fShowFacet$fEqUniqueKeyOrKeyRef$fShowUniqueKeyOrKeyRef $fEqUnique $fShowUnique$fEqKey $fShowKey $fEqKeyRef $fShowKeyRef $fEqSelector$fShowSelector $fEqField $fShowField$fEqAnnotation$fShowAnnotation$fEqPrimitiveType$fShowPrimitiveType$fEqUse $fShowUse $fEqOccurs $fShowOccurs$fEqNameAndType$fShowNameAndType $fEqFacetType$fShowFacetTypePositiveIntegerPositive UnsignedByteUByte UnsignedShortUShort UnsignedIntUInt UnsignedLongULongNonNegativeIntegerNonNegByteShortLongNegativeIntegerNegativeNonPositiveIntegerNonPosNCNameLanguageNormalizedString Normalized XsdStringacceptingParsersimpleTypeText$fSimpleTypeInt$fSimpleTypeInteger$fSimpleTypeDouble$fSimpleTypeFloat$fSimpleTypeBool$fSimpleTypeXsdString$fSimpleTypeBase64Binary$fSimpleTypeHexBinary$fSimpleTypeAnyURI$fSimpleTypeNOTATION$fSimpleTypeDecimal$fSimpleTypeDuration$fSimpleTypeDateTime$fSimpleTypeTime$fSimpleTypeDate$fSimpleTypeGYearMonth$fSimpleTypeGYear$fSimpleTypeGMonthDay$fSimpleTypeGDay$fSimpleTypeGMonth$fSimpleTypeNormalizedString$fSimpleTypeToken$fSimpleTypeLanguage$fSimpleTypeName$fSimpleTypeNCName$fSimpleTypeID$fSimpleTypeIDREF$fSimpleTypeIDREFS$fSimpleTypeENTITY$fSimpleTypeENTITIES$fSimpleTypeNMTOKEN$fSimpleTypeNMTOKENS$fSimpleTypeNonPositiveInteger$fSimpleTypeNegativeInteger$fSimpleTypeLong$fSimpleTypeShort$fSimpleTypeByte$fSimpleTypeNonNegativeInteger$fSimpleTypeUnsignedLong$fSimpleTypeUnsignedInt$fSimpleTypeUnsignedShort$fSimpleTypeUnsignedByte$fSimpleTypePositiveInteger$fEqPositiveInteger$fShowPositiveInteger$fEqUnsignedByte$fShowUnsignedByte$fEqUnsignedShort$fShowUnsignedShort$fEqUnsignedInt$fShowUnsignedInt$fEqUnsignedLong$fShowUnsignedLong$fEqNonNegativeInteger$fShowNonNegativeInteger$fEqByte $fShowByte $fEqShort $fShowShort$fEqLong $fShowLong$fEqNegativeInteger$fShowNegativeInteger$fEqNonPositiveInteger$fShowNonPositiveInteger $fEqNMTOKENS$fShowNMTOKENS $fEqNMTOKEN $fShowNMTOKEN $fEqENTITIES$fShowENTITIES $fEqENTITY $fShowENTITY $fEqIDREFS $fShowIDREFS $fEqIDREF $fShowIDREF$fEqID$fShowID $fEqNCName $fShowNCName $fShowName $fEqLanguage$fShowLanguage $fEqToken $fShowToken$fEqNormalizedString$fShowNormalizedString $fEqGMonth $fShowGMonth$fEqGDay $fShowGDay $fEqGMonthDay$fShowGMonthDay $fEqGYear $fShowGYear$fEqGYearMonth$fShowGYearMonth$fEqDate $fShowDate$fEqTime $fShowTime $fEqDateTime$fShowDateTime $fEqDuration$fShowDuration $fEqDecimal $fShowDecimal $fEqNOTATION$fShowNOTATION $fEqAnyURI $fShowAnyURI $fEqHexBinary$fShowHexBinary$fEqBase64Binary$fShowBase64Binary $fEqXsdString$fShowXsdString nullNamespace expandedName namespaceName localName printableNamequalify deQualifyqualifyExceptLocalinitNamespaceEnvaugmentNamespaceEnvresolveAllNames NameConvertermodidconidvaridunqconidunqvaridfwdconidfieldidHNameXNamesimpleNameConverterescape avoidKeywordsfpmlwordsBybasenamefpmlNameConverter $fShowHName $fEqXName $fShowXNamedocumentprolog doctypedeclelementcontentcpConstrHTypePrim HTypeabletoHType showConstrtoDTD showHType $fEqHType $fHTypeable[]$fHTypeableEither$fHTypeableMaybe$fHTypeable(,,,,,,,,,,,,,,)$fHTypeable(,,,,,,,,,,,,,)$fHTypeable(,,,,,,,,,,,,)$fHTypeable(,,,,,,,,,,,)$fHTypeable(,,,,,,,,,,)$fHTypeable(,,,,,,,,,)$fHTypeable(,,,,,,,,)$fHTypeable(,,,,,,,)$fHTypeable(,,,,,,)$fHTypeable(,,,,,)$fHTypeable(,,,,)$fHTypeable(,,,)$fHTypeable(,,)$fHTypeable(,) $fHTypeable()$fHTypeableChar$fHTypeableDouble$fHTypeableFloat$fHTypeableInteger$fHTypeableInt$fHTypeableBool $fEqConstr $fShowConstr $fShowHTypeXParserxmlParsedtdParse xmlParseWithemptySTsfst3snd3thd3tokqnamecommentprocessinginstructionelemtag elemOpenTag elemCloseTag referencechardata xmlParse' dtdParse'cdsect SaxElementSaxDocTypeDeclSaxProcessingInstruction SaxCommentSaxElementOpenSaxElementClose SaxElementTag SaxCharData SaxReferencesaxParse attribute htmlParse htmlParse' XmlEscaper xmlEscapexmlEscapeContent xmlUnEscapexmlUnEscapeContent stdXmlEscaper mkXmlEscaper dtd2TypeDef LabelFilterThenElse:>CFilterkeepnonechildrenpositionelmtxttagtagWithattrattrvalfindiffindifTxt?>ounioncatandThen childrenBy|>|withwithout/><*>pureControl.ApplicativeZipList getZipList WrappedMonad WrapMonad unwrapMonad WrappedArrow WrapArrow unwrapArrowoptionalData.Functor.ConstConstgetConst Data.Foldableasum Data.Functor<$> Alternativesomemany<|>emptyliftA3liftA<**>$polyparse-1.13-GKpg5tjbtUKuQvA8hlu3S Text.Parse allAsString parseLitChar parseLitChar' parseFloatparseHexparseOctparseDecparseInt parseSigned enumeration constructorsfieldoptionalParensisWordwordreadsPrecByParsePrec readByParse parseByRead TextParserParse parseListparse parsePrec!Text.ParserCombinators.Poly.Plain runParser"Text.ParserCombinators.Poly.Parserreparse satisfyMsgsatisfyeofnextonFailParserP"Text.ParserCombinators.Poly.ResultResult CommittedSuccessFailure Text.ParserCombinators.Poly.Base manyFinally' manyFinallybracket bracketSepsepBy1sepBymany1uptoexactlyindentoneOf adjustErrBadfailBaddiscardapply CommitmentoneOf'commit adjustErr PolyParse markupdecl<><+>$$GHC.Num- toXmlLazyorppModIdppConIdppVarId ppUnqConId ppUnqVarId ppFwdConIdppAttrppElemppHighLevelInstances ppExtensionppSuperExtensionppFieldsppFieldElementppElemTypeNameppFieldAttributeppTypeModifierppElemModifier paragraphppCommentForChoice toXmlAttr toXmlElem ppFieldNamexmlElemModifier cleanChoicesliftedElemModifier parseXtract'