/[suikacvs]/messaging/manakai/lib/Message/DOM/ChangeLog
Suika

Diff of /messaging/manakai/lib/Message/DOM/ChangeLog

Parent Directory Parent Directory | Revision Log Revision Log | View Patch Patch

revision 1.31 by wakaba, Mon Oct 11 12:02:00 2004 UTC revision 1.150 by wakaba, Fri Mar 17 10:51:30 2006 UTC
# Line 1  Line 1 
1    2006-03-17  Wakaba  <wakaba@suika.fam.cx>
2    
3            * TreeCore.dis (NodeType, nodeType, localName, namespaceURI,
4            prefix, isSameNode, ownerDocument, parentNode): New.
5            (Element): New interface.
6            (createElementNS): New method.
7            (strictErrorChecking): New.
8    
9    2006-03-17  Wakaba  <wakaba@suika.fam.cx>
10    
11            * Makefile: |TreeCore.dis| is added.
12    
13            * TreeCore.dis: New module.
14    
15    2006-03-16  Wakaba  <wakaba@suika.fam.cx>
16    
17            * XMLParser.dis (cfg:entity-replacement-tree): New configuration
18            parameter.
19    
20            * DOMXML.dis (manakaiExpanded): Renamed from |isExpanded|.
21    
22            * DOMCore.dis, Tree.dis, DOMLS.dis, XMLParser.dis: Lexical
23            data types added to configuration parameters.
24    
25    2006-03-15  Wakaba  <wakaba@suika.fam.cx>
26    
27            * DOMCore.dis (c:DOMConfigurationParameter): Now it is
28            a |DISSource:ResourceProperty|.
29            (c:anyDOMConfigurationParameter): New property.
30            (CParam, boolCParam): Now they are all |dis:subsetOf|
31            the |c:anyDOMConfigurationParameter| property.
32            (ForDocument, ForParser, ForSerializer): Removed.
33    
34            * DOMLS.dis, XMLParser.dis: Likewise.
35    
36    2006-03-12  Wakaba  <wakaba@suika.fam.cx>
37    
38            * DOMMain.dis, Tree.dis: Unused |dis:aliasChild| properties
39            are removed.
40    
41            * GenericLS.pm: Added to the CVS repository since
42            it is necessary to create the |Message::Util::DIS::DPG| module.
43    
44    2006-03-10  Wakaba  <wakaba@suika.fam.cx>
45    
46            * DOMCore.dis, DOMXML.dis, XDoctype.dis (manakaiAppendText): New
47            method.
48    
49            * XMLParser.dis: Don't create adjacent text nodes.
50    
51    2006-03-09  Wakaba  <wakaba@suika.fam.cx>
52    
53            * DOMCore.dis (HIERARCHY_DOCUMENT_FRAGMENT_ITSELF_ERR): New error.
54    
55            * DOMXML.dis (appendChild, insertBefore, replaceChild): Method
56            implementations are added.
57    
58            * XDoctype.dis (appendChild, insertBefore, replaceChild): Method
59            implementations are added.
60    
61            * Tree.dis (appendChild, insertBefore, replaceChild): Method
62            implementations are added.
63            (IFCls1Def, NodeTypeDef): Don't define |ManakaiDOM:ForClass|
64            resources unless for |ManakaiDOM:ManakaiDOMLatest|.
65            (cfg:strict-document-children): New configuration parameter.
66    
67    2006-03-08  Wakaba  <wakaba@suika.fam.cx>
68    
69            * XDoctype.dis (replaceChild): Method implementations are added.
70    
71            * Tree.dis (replaceChild): Method implementations are added.
72    
73            * DOMXML.dis (replaceChild): Method implementations are added.
74    
75    2006-03-07  Wakaba  <wakaba@suika.fam.cx>
76    
77            * Tree.dis (ForAppendChild, ForInsertBefore, ForReplaceChild): New |for|
78            definitions.
79    
80            * XDoctype.dis (insertBefore): New method implementation.
81    
82    2006-03-06  Wakaba  <wakaba@suika.fam.cx>
83    
84            * DOMXML.dis (insertBefore): Method implementations
85            for |ProcessingInstruction| and |Notation| nodes are added.
86    
87            * Tree.dis (insertBefore): Method implementation
88            for |CharacterData| nodes is added.
89    
90            * XDoctype.dis (insertBefore): Method implementation
91            for |ElementTypeDefinition| nodes is added.
92    
93    2006-03-06  Wakaba  <wakaba@suika.fam.cx>
94    
95            * XDoctype.dis (appendChild): New method implementation.
96    
97    2006-03-06  Wakaba  <wakaba@suika.fam.cx>
98    
99            * DOMCore.dis (HIERARCHY_WRONG_DOCTYPE_ERR): New error.
100            (REMOVE_DOCUMENT_ELEMENT_ERR): New error.
101            (REMOVE_DOCUMENT_TYPE_ERR): New error.
102    
103            * DOMXML.dis (ManakaiDOMDocumentType): Removed.
104            (ProcessingInstruction.appendChild, CDATASection.appendChild,
105            Notation.appendChild): New method implementation.
106    
107            * Tree.dis (CharacterData.appendChild): New method implementation.
108    
109            * XDoctype.dis: Tests moved from |MDOM:DOMXML| module.
110    
111    2006-03-06  Wakaba  <wakaba@suika.fam.cx>
112    
113            * DOMXML.dis (ManakaiDOMXMLIdAttr): New class.
114    
115            * Tree.dis (createAttribute, createAttributeNS,
116            setAttribute, setAttributeNS): They now supports
117            the |cfg:xml-id| configuration parameter.
118            (cfg:xml-id): New configuration parameter.
119    
120            * XDoctype.dis (createAttributeDefinition): It now
121            supports the |cfg:xml-id| configuration parameter.
122    
123            * XMLParser.dis (parse): It now supports
124            the |cfg:xml-id| configuration parameter.
125    
126    2006-03-05  Wakaba  <wakaba@suika.fam.cx>
127    
128            * XMLParser.dis (parse): Sets |Document.documentURI|
129            and |Document.manakaiEntityBaseURI| attributes of the
130            document created.
131            (_ProcessingInstructionDTD): Sets the |manakaiBaseURI|
132            property of the created node.
133            (_SystemLiteral): Sets the |manakaiDeclarationBaseURI|
134            of the created node.
135            (ls-input-to-input-file.default): Sets the resolved
136            system identifier to the |documentURI| attribute if available.
137            Sets the |baseURI| attribute if available.
138    
139    2006-03-05  Wakaba  <wakaba@suika.fam.cx>
140    
141            * XDoctype.dis (DocumentTypeDefinition.implementation): New attribute.
142            (Node.baseURI): New attribute implementations.
143            (declarationBaseURI): Setter is added.
144            (manakaiDeclarationBaseURI): New attribute.
145    
146            * Tree.dis (Require): A reference to the |MURI:Generic|
147            module is added.
148            (Node.baseURI): The implementation is revised.
149            (getNodeReference): Attribute node classes specialized
150            to attribute names are supported.
151            (contentBaseURI, htmlBaseURI): Removed.
152            (manakaiEntityBaseURI): New attribute.
153            (ManakaiDOMImplementationDocument): It now inherits
154            the |urigen:URIImplementation| class.
155    
156            * DOMMain.dis (isRelativeDOMURI): The definition
157            of the URI scheme is synced with |Message::URI::Generic|'s
158            one.
159    
160            * DOMXML.dis (Require): A reference to |DISlib:DISMarkup|
161            module is added.
162            (DocumentType.implementation): New attribute.
163            (Node.baseURI): Implementations are added.
164            (manakaiDeclarationBaseURI): New attributes.
165            (manakaiEntityBaseURI): New attributes.
166            (manakaiEntityURI): New attribute.
167            (manakaiExternal): New attribute.
168            (manakaiBaseURI): New attribute.
169            (ManakaiDOMXMLBaseAttr): New class.
170    
171    2006-02-26  Wakaba  <wakaba@suika.fam.cx>
172    
173            * SimpleLS.dis (Require): Reference to the |MDOM:Tree|
174            module was missing.
175    
176            * ManakaiDOMLS2003.dis: Some property names was incorrect.
177    
178            * Makefile (distclean): New rule.
179    
180    2006-02-26  Wakaba  <wakaba@suika.fam.cx>
181    
182            * DOMLS.dis: Removed from the CVS repository, since
183            it has been no longer required to make the |daf| system
184            itself.
185    
186    2006-02-26  Wakaba  <wakaba@suika.fam.cx>
187    
188            * Makefile: Revised for new |daf| database format.
189    
190    2006-02-25  Wakaba  <wakaba@suika.fam.cx>
191    
192            * DOMFeature.dis (Require): Missing reference to |DISlib:Test|
193            module is added.
194    
195    2006-02-22  Wakaba  <wakaba@suika.fam.cx>
196    
197            * DOMLS.dis: Constants were typed as |dx:ErrorCode|
198            by mistake.
199    
200    2006-02-18  Wakaba  <wakaba@suika.fam.cx>
201    
202            * XMLParser.dis (ManakaiDOMXMLParser): Implements |DOMLS:ParseString10|
203            feature.
204    
205            * DOMCore.dis (c:LSPARSER_NOT_FOUND_ERR): New exception type.
206    
207            * DOMLS.dis (DOMLS:ParseString): New (moved from |SimpleLS.dis|).
208            (DOMImplementationLS.createLSParser): Implemented.
209            (DOMImplementationLS.createLSInput): Revised.
210            (LSInput): Note on relationship with |GenericLS| is added.
211    
212            * SimpleLS.dis (DOMLS:ParseString): Removed (moved to |SimpleLS.dis|).
213    
214    2006-02-17  Wakaba  <wakaba@suika.fam.cx>
215    
216            * XMLParser.dis (domConfig): New |targetType| of |xp:ManakaiDOMXMLParser|
217            is introduced.
218            (async, busy): Implemented.
219            (parseString): Removed.
220            (parse, parseURI): Implemented.
221            (xp:ls-input-to-input-file): New configuration parameter.
222            (shiftChar): Gets character from current file handle
223            rather than replacement text.  Don't normalize
224            line break characters for internal entities.  Don't
225            throw |xp:wf-legal-literal-character| error
226            for |RestrictedChar| appearing in internal entities.
227            (DISPerl:dpgDef): Call |close| for each entity filehandler.
228            (_EntityDeclaration): Copy document URI and base URI
229            to the entity's |$decl| object.
230            (ParseError): New code fragment.
231            (getCopyOfEntityState): Creates filehandle from replacement
232            text.
233            (xp-error-lines): Don't appends text if no replacement
234            text is available.
235            (error-handler): New configuration parameter application resource.
236            (ManakaiDOMLSInputToInputFile): New class.
237            (ManakaiDOMInputFile): New class.
238    
239            * Tree.dis (getNodeReference): A dereferencing was missing.
240    
241            * DOMLS.dis (DOMLS:busy, DOMLS:lsKey): New properties.
242    
243    2006-02-17  Wakaba  <wakaba@suika.fam.cx>
244    
245            * XMLParser.dis: Default attribute are now namespace aware.
246            (parseString): Don't output |Document| warnings
247            during tree construction to standard error output.
248    
249    2006-02-16  Wakaba  <wakaba@suika.fam.cx>
250    
251            * XMLParser.dis: Name check for XML 1.0, XML Namespace 1.0, and
252            XML Namespace 1.1 is implemented.  Namespace well-formedness
253            error detection is implemented.  Generates |Notation| nodes
254            from notation declarations.
255            (checkNCName, checkQName): New code fragments.
256    
257            * XDoctype.dis (DocumentXDoctype): Factory methods
258            don't check |MDOMX:MDOM_BAD_NAME| if |Document.strictErrorChecking|
259            is |false|.
260    
261            * DOMCore.dis (wf-invalid-character-in-node-name,
262            wf-invalid-character): Removed (moved to |MDOM:Tree| module).
263    
264            * Tree.dis '(wf-invalid-character-in-node-name,
265            wf-invalid-character): New errors (from |MDOM:DOMCore| module).
266            (Attr.specified): Setter added.
267            (cfg:dtd-default-attributes): New configuration parameter.
268            (Document.createEntityReference): Don't check |MDOMX:MDOM_BAD_NAME|
269            if |Document.strictErrorChecking| is |false|.
270    
271    2006-02-15  Wakaba  <wakaba@suika.fam.cx>
272    
273            * XMLParser.dis: Set |allDeclarationsProcessed|
274            attribute of the |Document| node.  Don't process entity
275            and attribute definition list declarations after
276            unread parameter entity reference.  Warns if an attribute definition is
277            ignored (|xp:warning-attribute-definition-ignored|).  Set
278            flags whether predefined entities are declared or not.
279            WFC error |xp:wf-pes-in-internal-subset| is implemented.
280    
281    2006-02-15  Wakaba  <wakaba@suika.fam.cx>
282    
283            * XMLParser.dis: Issues |xp:error-internal-predefined-entity| error
284            if a predefined entity declaration references an external entity.
285            Issues |xp:error-malformed-predefined-entity| error if
286            a predefined entity declaration defines different thing than
287            one as in XML specification.  
288            Issies |xp:warning-entity-declaration-ignored| warning if
289            more than one entity declarations for an entity is found.
290            (WFErrDef): Now all well-formedness errors are marked
291            as |SEVERITY_FATAL_ERROR|.
292    
293            * XDoctype.dis (DocumentXDoctype.createDocumentTypeDefinition): Creates
294            predefined entity declarations.
295            (DocumentXDoctype.createNotation): New method.
296            (DocumentTypeDefinition.notations): New attribute.
297            (DocumentTypeDefinition.getNotationNode): New method.
298            (DocumentTypeDefinition.setNotationNode): New method.
299            (newNotationForTest): New code fragment.
300    
301            * Tree.dis (ManakaiDOMXML:ManakaiDOMNotations): Removed.
302            (c:ManakaiDOMNotationMap): New class.
303            (c:ManakaiDOMNotationMapArray): New class.
304            (Document.allDeclarationsProcessed): New attribute.
305    
306            * DOMXML.dis (DocumentType.notations): Implemented.
307            (Notation): Revised.
308            (Notation.ownerDocumentTypeDefinition): New attribute.
309    
310    2006-02-14  Wakaba  <wakaba@suika.fam.cx>
311    
312            * XMLParser.dis: The |xp:wf-parsed-entity| and the |xp:wf-no-recursion|
313            WFC errors are implemented.  Reports a |xp:wf-syntax-error|
314            if a parameter entity declaration contains |NDATA| keyword.
315            (setEmptyEntityState): Set |name| attribute.
316    
317            * Tree.dis (createEntityReference): Don't enter into inifinite
318            loop even if entity replacement tree contains recursive
319            reference directly or indirectly.
320    
321    2006-02-13  Wakaba  <wakaba@suika.fam.cx>
322    
323            * XMLParser.dis (_GeneralEntityReferenceAE): The |xp:wf-entity-declared|
324            WFC error is implemented.
325    
326    2006-02-13  Wakaba  <wakaba@suika.fam.cx>
327    
328            * XMLParser.dis: Set |cfg:clone-entity-reference-subtree|
329            configuration parameter |true| during tree construction
330            to ensure default attribute value is cloned as is
331            including entity reference subtree.
332    
333            * Tree.dis (cfg:clone-entity-reference-subtree): New configuration
334            parameter.
335            (Node.cloneNode): The |cfg:clone-entity-reference-subtree|
336            configuration parameter support is added.
337    
338    2006-02-12  Wakaba  <wakaba@suika.fam.cx>
339    
340            * XMLParser.dis (parseString): General |Entity| replacement
341            tree is not constructed because of a typo.  Clears |EntityReference|
342            content before constructing |Entity| replacement tree.
343            The |xp:wf-entity-declared| well-formedness constraint
344            for entity references in attribute value literal is implemented.
345    
346    2006-02-11  Wakaba  <wakaba@suika.fam.cx>
347    
348            * XMLParser.dis: |xp:wf-entity-declared| well-formedness
349            constaraint for entity references that appear in
350            content of elements is implemented.   Set |EntityReference.isExpanded|
351            attribute.
352            (getEmptyEntityState): New code.
353    
354            * XDoctype.dis (DocumentTypeDefinition.nodeType): Duplicate
355            definition is removed.
356    
357            * DOMXML.dis (Entity.isExternallyDeclared): New attribute.
358            (EntityReference.isExpanded): Setter is added.
359    
360    2006-02-11  Wakaba  <wakaba@suika.fam.cx>
361    
362            * XMLParser.dis: |xp:wf-no-lt-in-attribute-values|
363            and |xp:wf-no-external-entity-references| well-formedness
364            constraints are implemented.
365    
366    2006-02-11  Wakaba  <wakaba@suika.fam.cx>
367    
368            * XMLParser.dis ($self->{has_error}): Removed.
369            (parseString): Don't throw |DOMLS:PARSE_ERR| if all fatal
370            errors (including well-formedness constraint errors) are
371            traped by the error handler.
372            (PubidLiteral, SystemLiteral): Set |publicId| or |systemId|
373            attribute of the node.  Reports an error if |publidLiteral|
374            contains a non-|pubidChar|.
375    
376            * XDoctype.dis (d:DeclFeature30): New feature (|fe:XDoctypeDeclaration|
377            version |3.0|).
378            (ManakaiDOMDocumentTypeDefinition): The class no longer
379            inherits |x:ManakaiDOMDocumentType| class.  Instead,
380            it inherits |d:ManakaiDOMDocumentTypeDeclaration|
381            and |t:ManakaiDOMNOde| classes.  It still implements |x:DocumentType|
382            interface (except unimplemented |notations| and |internalSubset|
383            attributes).
384            (ManakaiDOMDocumentTypeDefinition.entities): New attribute
385            for compatibility with |x:DocumentType| interface.
386            (ManakaiDOMDocumentTypeDefinition.lookupPrefix): New method.
387            (ManakaiDOMDocumentTypeDefinition.getFeature): New method.
388            (ManakaiDOMDocumentTypeDefinition.nodeType,
389            ManakaiDOMDocumentTypeDefinition.textContent): New attributes.
390            (DocumentTypeDeclaration): New interface.
391    
392            * Tree.dis (Node/@f:implements): Typos fixed.
393            (Node.MUErrorHandler): Missing |last A| statement is added.
394            (createDocumentType): Throws an exception if |qualifiedName|
395            is illegal.  Calls |DocumentTypeDefinition.newObject|
396            instead of obsolete |DocumentType.newObject|.
397    
398            * DOMXML.dis (DocumentType.name, DocumentType.entities,
399            DocumentType.publicId, DocumentType.systemId,
400            DocumentType.lookupPrefix, DocumentType.getFeature): Now they are defined
401            as clones of similar attributes or methods
402            in |MDOM:XDoctype| module.
403            (DocumentType.newObject): Removed (use |DocumentTypeDefinition.newObject|
404            instead).
405            (DocumentType.childNodes): Removed (|Node.childNodes| definition
406            is used).
407    
408    2006-02-10  Wakaba  <wakaba@suika.fam.cx>
409    
410            * XMLParser.dis (xp:fatal-xml11-end-of-line-in-xml-declaration): New
411            fatal error.
412    
413    2006-02-09  Wakaba  <wakaba@suika.fam.cx>
414    
415            * XMLParser.dis (CommentDeclaration): |STRING| is now
416            defined as a |?default-token|.
417            (XMLTests): Tests for |Char - RestrictedChar| matchness,
418            comment declarations, cdata sections, and |MSE| in |content|
419            added.
420            (XMLTests/PerlDef): Bug fixed: |pop| -> |shift|.
421            (get-location-from-token): |$token->{location_d}|
422            for |?default-token| column counting support added.
423    
424            * DOMCore.dis (c:erred): It is now a |DISCore:OrderedList| property.
425    
426    2006-02-08  Wakaba  <wakaba@suika.fam.cx>
427    
428            * Tree.dis (createProcessingInstruction): Don't
429            throw |MDOMX:MDOM_BAD_NAME| exception if |Document.strictErrorChecking|
430            is |false|.
431    
432            * XMLParser.dis (parseString): Initializes |$self->{location}|.
433            It enables improved error position report.
434            (XDO): It now includes |S+| following target name |xml| as
435            part of the token.  (PI with target starting with |xml|
436            was unable to be placed at the beginning of the document entity.)
437            (_ProcessingInstruction, _ProcessingInstructionDTD): Creates
438            a processing instruction node with |#INVALID| node name
439            if target name is not given and recovered from the error.
440            (S): Variable |$s| added.
441            (XMLTests): Tests for XML declarations and processing
442            instructions are added.  Prints error type name if unexpected
443            error with severity of error or fatal error has been reported.
444            Catch unexpected exceptions thrown in parser (different
445            from |LSException|), prints its message, and invoke |$test->not_ok|
446            for the ease of testing.
447            (xp:get-location-from-token): Location values now take |$self->{char}|
448            stack into acount.
449            
450    2006-02-08  Wakaba  <wakaba@suika.fam.cx>
451    
452            * XMLParser.dis (shiftChar): Line and column number counting
453            is fixed.  Although the DOM Level 3 Core specification
454            is unclear about whether the first number is zero or one,
455            in most programs the first line is "one" and
456            the first column is "one", manakai follows the practice.
457            (_XMLDeclaration): Don't set |xmlStandalone| value
458            if |standalone| pseudo-attribute value is |no|.  XML declaration
459            tests (successful cases) added.
460            (xp:get-location-from-token): Sets |lineNumber| and |columnNumber|
461            properties.
462    
463    2006-02-08  Wakaba  <wakaba@suika.fam.cx>
464    
465            * XMLParser.dis (XMLTests): Tests for |c:erred| is supported.
466    
467    2006-02-06  Wakaba  <wakaba@suika.fam.cx>
468    
469            * DOMCore.dis (c:erred): New property.
470            (c:DOMErrorType): It should have been a subset
471            of |ecore:AnyErrorCode|.
472    
473            * XMLParser.dis (XMLTests): Empty input tests added.
474    
475    2006-01-30  Wakaba  <wakaba@suika.fam.cx>
476    
477            * XDoctype.dis (d:Feature): New canonical feature
478            name |fe:XDoctype| is added.
479    
480            * XMLParser.dis: Predefined general entity references
481            are implemented.  Creates |Entity| nodes from general entities
482            declared in internal subset.  |Entity| nodes created from internal
483            general parsed entities now have replacement tree.
484            Sets |cfg:entity-reference-read-only| flag off during
485            the tree generation.  Some parsing rules use |$self->{doc}|
486            rather than |$doc| parameter.  Similarly, |$self->{docx}| (document
487            node with |fe:XDoctype| feature) and |$self->{dtdef}| are
488            introduced.  General entity references in attribute value literal
489            are supported.
490    
491    2006-01-29  Wakaba  <wakaba@suika.fam.cx>
492    
493            * Tree.dis (ManakaiDOM:entity-reference-read-only): Configuration
494            parameter name changed to |cfg:entity-reference-read-only|.
495            (createEntityReference): Set |c:read-only| flag of
496            the created entity reference, too.
497    
498            * DOMLS.dis (min): New canonical feature name |fe:Min| added.
499    
500            * GenericLS.dis: Don't refer |DOMMain:DOMString|; use |f:MIString|
501            from |DOMFeature| module instead.  Use |idl:Object|
502            instead of |DOMMain:DOMObject| as well.
503            (Generic): New canonical feature name |fe:GenericLS| added.
504            (DOMLS:ParserRole, DOMLS:SerializerRole): Their
505            canonical name changed to |gls:ParserRole| and |gls:SerializerRole|
506            respectively.
507    
508            * DOMXML.dis (entities, notations): Perl code removed.
509            It will be reimplemented using |DocumentTypeDefinition|
510            class from |XDoctype| module.
511    
512            * DOMFeature.dis, DOMCore.dis, DOMMain.dis, DOMXML.dis,
513            Tree.dis, DOMLS.dis, GenericLS.dis, ManakaiDOMLS2003.dis,
514            SimpleLS.dis: Cleaned up unused definitions.
515    
516            * DOMCore.dis, DOMLS.dis (CParam): Definitions
517            for LS module moved from |DOMCore| module to |DOMLS| module.
518            This change makes |DOMCore| to |DOMLS| dependency removed.
519    
520            * .cvsignore (.html.pm, .ls.pm): Removed.
521    
522            * Makefile (.html.pm, .ls.pm): Removed.
523            (feature.dae): Include |GenericLS| module.
524            (core.dae): Don't include |DOMLS| and |GenericLS| module.
525            (ls.dae): Include |DOMLS| module.
526    
527    2006-01-29  Wakaba  <wakaba@suika.fam.cx>
528    
529            * XMLParser.dis: Tests on default attributes and their |specified|
530            attribute are added.
531    
532            * XDoctype.dis (createGeneralEntity): New method.
533            (generalEntities): New attribute.
534            (getGeneralEntityNode, setGeneralEntityNode): New methods.
535    
536            * Tree.dis (ManakaiDOMEntities): Removed.
537            (ManakaiDOMEntityMap): New class.
538            (ManakaiDOM:entity-reference-read-only): New configuration parameter.
539            (createEntityReference): If there is a corresponding |Entity|
540            node in the document type definition, then copies its
541            subtree.
542    
543            * DOMXML.dis (Entity): Documentation updated.
544            (publicId, systemId, notationName, xmlEncoding,
545            xmlVersion): These attributes are now settable
546            if |ManakaiDOM:ManakaiDOMLatest| mode.
547            (hasReplacementTree): New attribute for |ManakaiDOM:ManakaiDOMLatest|
548            mode.
549            (ownerDocumentTypeDefinition): New attribute
550            for |ManakaiDOM:ManakaiDOMLatest| mode.
551            (isExpanded): New attribute for |ManakaiDOM:ManakaiDOMLatest| mode.
552    
553    2006-01-28  Wakaba  <wakaba@suika.fam.cx>
554    
555            * DOMCore.dis (ErrDef): Missing |ecore:textFormatter| property added.
556    
557            * DOMMain.dis (ErrDef): Missing |ecore:textFormatter| property added.
558    
559            * Tree.dis (ErrDef): Missing |ecore:textFormatter| property added.
560            (ManakaiDOMAttributes): Removed.
561            (ManakaiDOMAttrMap): New class.
562            (ManakaiDOMAttrMapArray): New class.
563            (namespaceURI): Bug to return a string representation
564            of a reference to the namespace URI string is fixed.
565            (selectAttrNodeObject, selectAttrNodeObjectNodeNS): Reimplemented.
566            (removeAttribute, removeAttributeNS): DTD default attributes
567            are supported.  Don't throw |NO_MODIFICATION_ALLOWED_ERR|
568            if there is no attribute node.
569            (createElement, createElementNS): DTD default attributes are supported.
570            (setAttributeNode): Reimplemented.
571    
572    2006-01-27  Wakaba  <wakaba@suika.fam.cx>
573    
574            * DOMCore.dis (ManakaiDOMDTDTypeInfo): New class.
575    
576            * Tree.dis (STORESIZE): Index bound bug fixed.
577            (Attr.value): Redefined to consist with |AttributeDefinition.nodeValue|.
578            (schemaTypeInfo): Implemented for XML DTD.
579            (isId): Returns |true| if [attribute type] is |ID|.
580            (setAttribute, setAttributeNS): Sets [attribute type]
581            of the newly created |Attr| node (if any) when attribute
582            definition is available.
583            (doctype, documentElement): Reimplemented with tests.
584    
585            * XMLParser.dis: Sets [attribute type] information
586            to created |Attr| nodes.  Normalize namespace URIs
587            when such information are available (unlikely but legal).
588            (_HexadecimalCharacterReference): Number to character
589            convertion bug fixed.
590            (_DocumentTypeDeclaration): Sets |schema-type|
591            configuration parameter to XML DTD URI.
592    
593    2006-01-26  Wakaba  <wakaba@suika.fam.cx>
594    
595            * XMLParser.dis (_AttlistDeclaration): Now it can generate
596            attribute definition nodes.
597    
598            * XDoctype.dis: |UNKNOWN_ATTR| is renamed as |NO_TYPE_ATTR|
599            and another |UNKNOWN_ATTR| constant is introduced
600            for consistency with XML Infoset.
601    
602            * DOMCore.dis (TypeInfo): Documentation updated.
603    
604    2006-01-26  Wakaba  <wakaba@suika.fam.cx>
605    
606            * XDoctype.dis: A bug in test code fixed.
607    
608            * Tree.dis (NamedNodeMap): Element type or attribute
609            definition named node maps now can be dereferenced
610            as if they are array or hash references.
611            (removeNamedItem, item, ___report_error): Implemented for element type
612            or attribute definitions.
613            (length): Tests added.
614            (NamedNodeMapArray): New classes.
615    
616    2006-01-25  Wakaba  <wakaba@suika.fam.cx>
617    
618            * XDoctype.dis (setElementTypeDefinitionNode,
619            setAttributeDefinitionNode): Throws |c:INUSE_DEFINITION_ERR|
620            if the new node is already used for another definition.
621            (DocumentTypeDefinition, ElementTypeDefinition): Node
622            property name was incorrect.
623            (elementTypes, attributeDefinitions): Checks to
624            ensure the collection is empty added.
625    
626            * Tree.dis: Property name typos fixed.
627            (setNamedItem, setAttributeNode): Don't return any node
628            if it replace itself.
629            (c:userDeterminedId): Missing definition added.
630    
631            * DOMXML.dis (Notation): Missing property specification
632            of|c:ownerDocument| as |mn:xrefnode0| is added.
633    
634    2006-01-23  Wakaba  <wakaba@suika.fam.cx>
635    
636            * DOMCore.dis (Test): Missing argument added.
637            (setNamedItem): If |DocumentType| with no |ownerDocument|,
638            addition always fails with |WRONG_DOCUMENT_ERR|.  Some
639            error conditions were incorrect.
640    
641            * .cvsignore: Dummy files added.
642    
643    2006-01-22  Wakaba  <wakaba@suika.fam.cx>
644    
645            * DOMCore.dis (NO_NAMED_NODE_ERR, NO_NAMED_NODE_NS_ERR,
646            INUSE_DEFINITION_ERR, NO_NS_NAMEDNODEMAP_ERR): New error subtypes.
647    
648            * DOMMain.dis (ensureXMLName): Checks definesness of |$XMLVERSION|
649            to avoid uninitialized value warning.
650    
651            * Tree.dis (ManakaiDOMElementTypeDefMap, ManakaiDOMAttrDefMap): New
652            classes (work in progress).
653    
654            * XDoctype.dis (elementTypes, attributeDefinitions): New attributes.
655    
656    2006-01-22  Wakaba  <wakaba@suika.fam.cx>
657    
658            * Tree.dis (getAttribute): Returns |null| if there
659            is no attribute in |ManakaiDOM:DOMLatest| for compatibility
660            with Web browser implementations.
661            (getAttributeNS): It returned |null| if there
662            is no attribute in any |For| unintentionally.  It now
663            returns an empty string in DOM levels less than or equals
664            to three.
665    
666            * XMLParser.dis (shiftChar): Fixed not to be warned as
667            uninitialized value or substring out of range.
668    
669    2006-01-21  Wakaba  <wakaba@suika.fam.cx>
670    
671            * DOMXML.dis (DocumentType.childNodes): Removed
672            from |ManakaiDOM:ManakaiDOMLatest| variant.
673    
674            * XMLParser.dis: Parsing of general internal entities implemented.
675            (_DocumentTypeDeclaration): Appends a document type definition
676            node to the document.
677            (_ProcessingInstructionDTD): Appends a processing
678            instruction node to the document type definition.
679            (Element_): Document element could not be an |EmptyElemTag|.
680    
681    2006-01-21  Wakaba  <wakaba@suika.fam.cx>
682    
683            * DOMFeature.dis (featuresParamToFeaturesHash): New block
684            code (seprated from |InputProcessor|).  Now
685            a |features| parameter's version can be specified by
686            an array reference that contains a set of version
687            numbers.  A test added.
688    
689            * XMLParser.dis: A test added.
690    
691    2006-01-07  Wakaba  <wakaba@suika.fam.cx>
692    
693            * DOMCore.dis (Test): Don't invoke |DESTROY| method
694            because it does not work with dummy object used in the test code.
695    
696    2006-01-07  Wakaba  <wakaba@suika.fam.cx>
697    
698            * DOMMain.dis (checkXMLNamesQName): Checks whether
699            namespace URI is defined for not being warned.
700    
701            * XDoctype.dis: New module.
702    
703            * DOMCore.dis (DOMStringList): Test added.
704    
705            * Makefile: |XDoctype.pm| added.
706    
707            * Tree.dis (Require): Requires |XDoctype.dis|.
708            (ManakaiDOMNodeObjectNode.eq): Added.
709            (Test): |DOMError.location| must return a |DOMLocator|
710            object (it was incorrectly tested to return |null|).
711            (EmptyNodeList.DESTROY): Removed.
712    
713    2006-01-04  Wakaba  <wakaba@suika.fam.cx>
714    
715            * Tree.dis (NodeType): |ELEMENT_TYPE_DEFINITION_NODE| and
716            |ATTRIBUTE_DEFINITION_NODE| node types added.
717            (appendChild, insertBefore, replaceChild): New
718            two node types added and processing instruction nodes
719            as document type definition node child is allowed
720            in |ManakaiDOM:ManakaiDOMLatest| mode.
721            (getNodeReference): New |interface| parameter
722            to filter classes by interface is added.
723            (ElementTypeDefinitionRole): New role.
724            (AttributeDefinitionRole): New role.
725    
726    2006-01-02  Wakaba  <wakaba@suika.fam.cx>
727    
728            * DOMCore.dis (DOMStringList): Reimplemented as tied array.
729    
730    2005-12-31  Wakaba  <wakaba@suika.fam.cx>
731    
732            * DOMCore.dis (DOMError.location): Returns an empty |DOMLocator|
733            if it is not provided.
734    
735            * XMLParser.dis: Parsing methods to skip document
736            type declaration is added.
737    
738    2005-12-29  Wakaba  <wakaba@suika.fam.cx>
739    
740            * XMLParser.dis (shiftChar): Checks characters are legal
741            or not.  Normalize end-of-lines.
742            (rule _XMLDeclaration_): Implemented.
743            (WFErrDef): Well-formedness error |wf-syntax-error|,
744            |wf-pi-target-is-xml|, |wf-no-end-tag|,
745            |wf-unsupported-xml-version|, |wf-malformed-enc-name|,
746            |wf-malformed-xml-standalone|, |wf-legal-literal-character|,
747            |wf-element-type-match|, |wf-unique-att-spec|,
748            |wf-legal-character| added.
749            (%character-code-point): New formatter rule.
750    
751            * Tree.dis (Document.xmlEncoding): It is now read-write attribute.
752    
753            * DOMCore.dis (DOMError.stringify): Added.
754            (error-handler.default): Returns |false| (don't continue)
755            when the error severity is |SEVERITY_FATAL_ERROR|.
756    
757    2005-12-28  Wakaba  <wakaba@suika.fam.cx>
758    
759            * XMLParser.dis (DocumentEntity): Typos fixed.
760            (|lexmode|s): New |?default-token| statements are used
761            so that tokenizer description has been simplified
762            and CDATA sections now can be parsed.
763    
764    2005-12-28  Wakaba  <wakaba@suika.fam.cx>
765    
766            * XMLParser.dis: Some modifications made.
767    
768    2005-12-27  Wakaba  <wakaba@suika.fam.cx>
769    
770            * DOMLS.dis (PARSE_ERR, SERIALIZE_ERR): They are now a
771            global named resource.
772    
773            * Makefile: Rules to make |XMLParser.pm| is added.
774    
775            * XMLParser.dis: New file.
776    
777    2005-12-24  Wakaba  <wakaba@suika.fam.cx>
778    
779            * DOMCore.dis (ManakaiDOMError._FORMATTER_PACKAGE_): Error
780            message formatter can now vary by error types.
781            (DOMLocator.utf32Offset): New (manakai extended) attribute.
782    
783    2005-12-23  Wakaba  <wakaba@suika.fam.cx>
784    
785            * DOMCore.dis (DOMLocator): Implemented.
786    
787    2005-12-21  Wakaba  <wakaba@suika.fam.cx>
788    
789            * DOMCore.dis (DOMConfigurationParameterApplication,
790            domConfigurationParameter): New resources.
791    
792    2005-11-25  Wakaba  <wakaba@suika.fam.cx>
793    
794            * Tree.dis (NodeList.___report_error, NamedNodeMap.___report_error):
795            New methods.
796    
797    2005-11-24  Wakaba  <wakaba@suika.fam.cx>
798    
799            * DOMMain.dis, DOMLS.dis, DOMXML.dis, Tree.dis: Old |__WARNING__|
800            blocks are replaced by |DOMError|-based |__DOMCore:ERROR__| blocks.
801    
802            * DOMMain.dis (___report_error): Throws the error unkess
803            it is a |DOMCore:DOMError| object.
804            
805    2005-11-24  Wakaba  <wakaba@suika.fam.cx>
806    
807            * DOMCore.dis (severity, type): Getters return value from
808            the definition of the current error (i.e. |-def| hash).
809            (___error_def): New method.
810            (errorType): |dis:dataType| changed to |DISCore:TFQNames|
811            to ease natural reference to constant value.
812            (error-handler.default): Prints the error message by |warn|.
813    
814            * Tree.dis (nodeValue.set): Reimplemented so that it
815            warns as setting has no effect.
816            (___report_error): New method.  (It had been only implemented
817            in superclass.)
818            (setting-node-value-no-effect): New error type.
819    
820    2005-11-23  Wakaba  <wakaba@suika.fam.cx>
821    
822            * DOMCore.dis: Error codes added.
823    
824            * Tree.dis (destroyNodeStem): New method implementation.
825    
826    2005-11-22  Wakaba  <wakaba@suika.fam.cx>
827    
828            * Tree.dis (cloneNode): User data handlers implemented.
829            (adoptNode): User data handlers implemented.
830            
831    2005-11-21  Wakaba  <wakaba@suika.fam.cx>
832    
833            * DOMCore.dis (UserDataHandler): A constraint for Perl binding
834            added.
835    
836            * Tree.dis (cloneNode): Invoking of |UserDataHandler|s are implemented.
837            (getUserData, setUserData): Implemented.
838    
839    2005-11-20  Wakaba  <wakaba@suika.fam.cx>
840    
841            * DOMCore.dis (UserDataHandler): Implemented.
842            (DOMErrorHandler): Blessed package name bug fixed.
843    
844            * ManakaiDOMLS2003.dis: Reference to |Node| subclasses
845            changed to |Tree.dis|.
846            
847    2005-11-20  Wakaba  <wakaba@suika.fam.cx>
848    
849            * DOMMain.dis: Unused declarations and definitions removed.
850    
851            * DOMCore.dis: DOM document tree related interfaces removed.
852    
853            * Tree.dis: New module separated from |DOMCore.dis|.
854    
855            * DOMXML.dis: Some referent changed to |Tree.dis|.
856    
857            * Makefile: |Tree.dis| added.
858    
859    2005-11-16  Wakaba  <wakaba@suika.fam.cx>
860    
861            * .cvsignore: Revised.
862            
863    2005-11-16  Wakaba  <wakaba@suika.fam.cx>
864    
865            * ManakaiDOMLS2003.dis: Tests added.
866            (domConfig): Method name in the code fixed to |flag|.
867    
868            * DOMMain.dis (findOffset32): Missing |^| in regular expressions
869            added.
870    
871            * DOMCore.dis (hasChildNodes): Returns |false| if the node type
872            is defined not to have any children.
873            (CharacterData): Typos in element type names and function names fixed.
874    
875    2005-11-15  Wakaba  <wakaba@suika.fam.cx>
876    
877            * DOMFeature.dis (MinimumImplementation.eq): Added.
878    
879            * DOMMain.dis: |DISPerl:ISA| reference fixed.
880    
881            * Generic.dis: Implements new |DOMLS:Generic| feature.
882    
883    2005-11-15  Wakaba  <wakaba@suika.fam.cx>
884    
885            * DOMFeature.dis (stringifyFeatures): Don't double |SPACE|
886            characters between feature names and versions.
887    
888    2005-11-13  Wakaba  <wakaba@suika.fam.cx>
889    
890            * DOMFeature.dis (stringifyFeatures): A test code added.
891    
892    2005-10-26  Wakaba  <wakaba@suika.fam.cx>
893    
894            * SimpleLS.dis (writeToString): Don't stop serializing
895            when an |false| value appears in |@src|.
896    
897    2005-10-16  Wakaba  <wakaba@suika.fam.cx>
898    
899            * DOMCore.dis (DOMError, DOMErrorHandler): Reimplemented.
900            (ErrDef): Redefined.
901    
902            * DOMLS.dis (ErrDef): Redefined.
903    
904    2005-10-16  Wakaba  <wakaba@suika.fam.cx>
905    
906            * DOMCore.dis (DOMConfiguration): Extends "ManakaiDOM:ManakaiDOMObject".
907    
908    2005-10-15  Wakaba  <wakaba@suika.fam.cx>
909    
910            * DOMCore.dis (Require): References "DOMLS.dis" module.
911            (CParam): Definitions for LS module added.
912    
913            * DOMLS.dis (ManakaiDOMLSInput): The input processor
914            is also an output processor now.
915            (ManakaiDOMLSResourceResolver): Implemented.
916            (CParam): Definitions updated.
917    
918    2005-10-14  Wakaba  <wakaba@suika.fam.cx>
919    
920            * DOMCore.dis (NOT_RECOGNIZED_CONFIG_PARAM_ERR,
921            NOT_SUPPORTED_CONFIG_VALUE_ERR,
922            INCOMPATIBLE_CONFIG_VALUE_ERR): New error subcodes.
923            (DOMConfiguration): Implemented.
924            (CParam): Definitions updated.
925    
926            * DOMMain.dis (DOMURIs): New data type.
927            
928    2005-10-13  Wakaba  <wakaba@suika.fam.cx>
929    
930            * DOMCore.dis (setAttrValueNS): New code.
931    
932    2005-10-12  Wakaba  <wakaba@suika.fam.cx>
933    
934            * DOMCore.dis: Don't set "infoset:prefix" internal
935            property unless it has non-null value.
936            (newObject): "refNode" parameter introduced.
937            (ManakaiDOMNode.newObject): Calls "NodeStem.newNode"
938            method if "refNode" parameter is specified.
939            (cloneNode): Don't set "read-only" flag.
940            (getNodeReference): Caches the result.
941            (selectAttributeNodeForRemove): Don't removes any other
942            non-namespace-aware attribute nodes.
943    
944    2005-10-11  Wakaba  <wakaba@suika.fam.cx>
945    
946            * DOMCore.dis (appendChild, createElementNS, createAttributeNS,
947            setAttribute, setAttributeNS): "strictErrorChecking" attribute supported.
948            (doStrictErrorChecking): New code.
949    
950            * DOMMain.dis (XML10Name, XML11Name): "strictErrorChecking" attribute
951            supported.
952    
953            * Makefile: Rule to make "DOMFeature.pm" restored.
954    
955    2005-10-10  Wakaba  <wakaba@suika.fam.cx>
956    
957            * DOMCore.dis (ADOPT_NODE_TYPE_NOT_SUPPORTED_ERR): New error subcode.
958            (adoptNode): Implemented.
959    
960    2005-10-09  Wakaba  <wakaba@suika.fam.cx>
961    
962            * DOMHTML.dis, DOMWebForms.dis: Typos in element type prefix fixed.
963    
964            * DOMFeature.dis (DOMCore:implementation): Short name added.
965    
966            * DOMCore.dis (CLONE_NODE_TYPE_NOT_SUPPORTED_ERR): New error subcode.
967            (DOMCore:node): New error parameter.
968            (DOMCore:ownerDocument): Changed from "mn:irefnode0"
969            to "mn:xrefnode0".  For this reason, all assignments
970            to this property have been rewritten to references
971            to code "mn:setXRefNode".
972            (cloneNode): Implemented.
973            (setAttributeNode): A missing "importTree" method call added.
974            (setAttributeNodeNS): Perl code removed and changed
975            to a reference to "setAttributeNode" method code.
976    
977            * DOMXML.dis (DOMCore:ownerDocument): Changed from "mn:irefnode0"
978            property to "mn:xrefnode0" property.
979    
980    2005-10-08  Wakaba  <wakaba@suika.fam.cx>
981    
982            * DOMCore.dis, DOMLS.dis: Now constant values are defined only
983            in interfaces.
984    
985    2005-10-06  Wakaba  <wakaba@suika.fam.cx>
986    
987            * DOMCore.dis (ManakaiDOMEmptyNodeList): New class.
988            (ManakaiDOMCharacterData): Methods reimplemented.
989            (splitText): Reimplemented.
990            (childNodes): Returns a "ManakaiDOMEmptyNodeList"
991            for non-parent node types.
992    
993            * DOMXML.dis (childNodes): Returns a "ManakaiDOMEmptyNodeList"
994                    for non-parent node types.
995    
996    2005-10-05  Wakaba  <wakaba@suika.fam.cx>
997    
998            * ManakaiDOMLS2003.dis: Revised to new format.
999    
1000            * GenericLS.dis (DOMLS:ParseString): New feature.
1001    
1002    2005-10-05  Wakaba  <wakaba@suika.fam.cx>
1003    
1004            * DOMFeature.dis: Description added and revised.  (Still more
1005            work required.)
1006    
1007    2005-10-04  Wakaba  <wakaba@suika.fam.cx>
1008    
1009            * DOMMain.dis (DOMString): The "idl:perl" attribute
1010            value has been changed from "DISPerl:String"
1011            to "DISPerl:CharacterString" to clarify its semantics.
1012    
1013    2005-10-03  Wakaba  <wakaba@suika.fam.cx>
1014    
1015            * DOMFeature.dis (MIString): Java, ECMAScript, and Perl bound
1016            type properties added.
1017    
1018            * DOMMain.dis (DataType): Java, ECMAScript, and Perl bound
1019            type properties added.
1020    
1021    2005-10-02  Wakaba  <wakaba@suika.fam.cx>
1022    
1023            * DOMFeature.dis (Module): "idl:prefix" and "idl:moduleName"
1024            properties added.
1025    
1026    2005-10-01  Wakaba  <wakaba@suika.fam.cx>
1027    
1028            * DOMFeature.dis: Documentation added (still work in progress).
1029            (MIString): New type.
1030    
1031            * DOMCore.dis (namespaceURI): Fixed to return the namespace
1032            URI value, not a reference to it.
1033    
1034    2005-09-30  Wakaba  <wakaba@suika.fam.cx>
1035    
1036            * DOMCore.dis, SimpleLS.dis: Shares namespace URIs and local
1037            names where possible.
1038    
1039            * DOMFeature.dis: Documentation for DOM Minimum Implementation
1040            added (still work in progress).
1041    
1042            * Makefile (feature.dae, feature-spec.dae): New rules.
1043    
1044    2005-09-27  Wakaba  <wakaba@suika.fam.cx>
1045    
1046            * DOMCore.dis (DOMCore:nodeProp): New property.
1047    
1048            * DOMCore.dis, DOMXML.dis: Codes to set properties "TreeCore:*"
1049            is removed.
1050    
1051    2005-09-26  Wakaba  <wakaba@suika.fam.cx>
1052    
1053            * DOMCore.dis, DOMXML.dis: New mn:* properties added.
1054    
1055    2005-09-25  Wakaba  <wakaba@suika.fam.cx>
1056    
1057            * Makefile (DAC_SUFFIX): Changed to ".dae".
1058            (DAEM_SUFFIX): New.
1059    
1060    2005-09-24  Wakaba  <wakaba@suika.fam.cx>
1061    
1062            * DOMMain.dis (MDOM:): Reintroduced for "ManakaiDOM:ManakaiDOM1"
1063            and "ManakaiDOM:ManakaiDOM2".
1064    
1065            * DOMFeature.dis, DOMMain.dis, DOMCore.dis, DOMXML.dis,
1066            DOMLS.dis, SimpleLS.dis, GenericLS.dis: Use disPerl:H
1067            instead of disPerl:Q for internal property hash keys.
1068    
1069            * DOMFeature.dis, DOMCore.dis, DOMXML.dis: Missing property
1070            definitions added.
1071    
1072            * DOMCore.dis (DOMCore:TextNode, DOMCore:DocumentFragmentNode):
1073            New resources.
1074            
1075            * DOMXML.dis (DOMXML:EntityNode, DOMXML:EntityReferenceNode): New
1076            resources.
1077    
1078    2005-09-23  Wakaba  <wakaba@suika.fam.cx>
1079    
1080            * GenericLS.dis, SimpleLS.dis: New modules separated
1081            from DOMLS.dis.
1082    
1083            * DOMFeature.dis, DOMMain.dis: "MDOM:" and "for" definitions
1084            moved from DOMMain to DOMFeature.  Now DOMFeature
1085            has no dependency on DOMMain.
1086    
1087            * DOMFeature.dis (DEBUG): New variable.
1088    
1089    2005-09-22  Wakaba  <wakaba@suika.fam.cx>
1090    
1091            * Makefile: DAC_SUFFIX changed to ".dad".
1092    
1093    2005-09-21  Wakaba  <wakaba@suika.fam.cx>
1094    
1095            * DOMCore.pm (DOMImplementation): Provides "XML" and "XMLVersion"
1096            features if it is "for" ManakaiDOM:DOMXMLFeature.
1097    
1098            * DOMMain.pm (StringExtend): Code portions of raising
1099            StringOutOfBoundsException is temporary disabled since
1100            it is not a DOM-style exception supported by
1101            current implementation of ManakaiNode - it will be
1102            recovered in later revision.
1103    
1104    2005-09-20  Wakaba  <wakaba@suika.fam.cx>
1105    
1106            * DOMFeature.pm: Debug output code copied
1107            from Attic/DOMMetaImpl.pm (Should these code incorporated
1108            to source dis file?).
1109    
1110    2005-09-19  Wakaba  <wakaba@suika.fam.cx>
1111    
1112            * DOMMain.dis (ManakaiDOM:DOMMethod, ManakaiDOM:DOMMethodReturn,
1113            ManakaiDOM:DOMAttribute, ManakaiDOM:DOMAttrGet,
1114            ManakaiDOM:DOMAttrSet, ManakaiDOM:DOMMethodParam): Removed.
1115            (ManakaiDOMTimeStamp): Removed.
1116    
1117            * DOMBoot.dis, DOMMetaImpl.dis, DOMMetaImpl.pm: Removed (they are no
1118            longer in use).
1119    
1120    2005-09-18  Wakaba  <wakaba@suika.fam.cx>
1121    
1122            * DOMMain.dis (StringOutOfBoundsException): New exception.
1123    
1124    2005-09-15  Wakaba  <wakaba@suika.fam.cx>
1125    
1126            * DOMFeature.dis: dis:dataType and dis:multipleProperties
1127            properties added to properties.
1128    
1129    2005-09-08  Wakaba  <wakaba@suika.fam.cx>
1130    
1131            * Makefile: Rules renewaled.
1132    
1133    2005-09-07  Wakaba  <wakaba@suika.fam.cx>
1134    
1135            * DOMCore.dis, DOMXML.dis, DOMLS.dis: Inheritance information fixed.
1136    
1137    2005-09-05  Wakaba  <wakaba@suika.fam.cx>
1138    
1139            * DOMMain.dis (DOMImplementationRegistry,
1140            DOMImplementationRegistryVar): New.
1141    
1142            * DOMFeature.dis (DOMImplementationRegistry,
1143            DOMImplementationRegistryVar): Removed.
1144            (ImplementationRegistry): New class.
1145    
1146    2005-09-04  Wakaba  <wakaba@suika.fam.cx>
1147    
1148            * DOMFeature.dis: New module.
1149    
1150            * DOMMetaImpl.dis (ManakaiDOM:ManakaiDOMObject): Removed.
1151    
1152            * DOMMain.dis (ManakaiDOM:ManakaiDOMObject): New.
1153            (DOMString, DOMTimeStamp): Now they are not interfaces
1154            but datatypes.
1155            (DOMUserData, DOMObject, DOMUserData): Now they
1156            are subtypes rather than aliases of their "real" type in IDL.
1157            
1158            * DOMCore.dis (DOMImplementationList, DOMImplementationSource):
1159            New interfaces and classes.    
1160    
1161    2005-09-01  Wakaba  <wakaba@suika.fam.cx>
1162    
1163            * DOMCore.dis (setTextNodeContent): Sets the infoset:parent
1164            property of the new Text node.
1165    
1166    2005-08-29  Wakaba  <wakaba@suika.fam.cx>
1167    
1168            * Makefile: Loads "NaturalLanguage.dis".
1169    
1170    2005-08-26  Wakaba  <wakaba@suika.fam.cx>
1171    
1172            * DOMCore.dis (createDocument): Set "ownerDocument" attribute
1173            to the root element created by the method.  (It was forgotten!!)
1174    
1175    2005-08-15  Wakaba  <wakaba@suika.fam.cx>
1176    
1177            * DOMCore.dis (appendChild, insertBefore, replaceChild): Typo
1178            in the code of removing the newChild from the previous
1179            parent of that node is fixed.
1180    
1181    2005-05-29  Wakaba  <wakaba@suika.fam.cx>
1182    
1183            * DOMLS.dis (SimpleSerializer): End tag was sometimes missing.  Use
1184            namespace prefix of element type if it is not declared
1185            but not used else.  A shift is replaced by pop:).
1186    
1187            * DOMCore.dis (getFeature): The getFeature method
1188            for Node-derived classes implemented.
1189            * DOMXML.dis (getFeature): Ditto.
1190    
1191    2005-05-21  Wakaba  <wakaba@suika.fam.cx>
1192    
1193            * DOMCore.dis (getNodeReference): Use HTMLDocument class
1194            if a document node has no document element node but
1195            has support for the "HTML" feature.
1196    
1197    2005-03-03  Wakaba  <wakaba@suika.fam.cx>
1198    
1199            * DOMMetaImpl.dis (features input normalizer): Variable name
1200            typo fixed.
1201            (ManakaiDOMImplementationSource.getDOMImplementation): Fixed bug
1202            so that version specification for "+"'ed feature name does work now.
1203    
1204    2005-03-02  Wakaba  <wakaba@suika.fam.cx>
1205    
1206            * DOMBoot.dis (ResourceDef): Definitions for DOMFeature are
1207            removed (now defined in DOMMetaImpl).
1208    
1209    2005-02-21  Wakaba  <wakaba@suika.fam.cx>
1210    
1211            * DOMMetaImpl.dis (IFClsDef[ManakaiDOMMinimumImplementation]): New.
1212    
1213            * Makefile: Rules for DOMMetaImpl module added.
1214    
1215    2005-02-20  Wakaba  <wakaba@suika.fam.cx>
1216    
1217            * DOMMetaImpl.dis: New module (split from DOMCore and DOMMain).
1218    
1219    2005-02-18  Wakaba  <wakaba@suika.fam.cx>
1220    
1221            * DOMCore.dis (getFeature): ManakaiDOM:ManakaiDOMNodeObject.newReference
1222            is an instance method, not a class method.
1223    
1224            * DOMMain.dis (ResourceTypeDef[ManakaiDOM:Const,
1225            ManakaiDOM:ConstGroup]): Removed (moved to "lib/manakai/DISLang.dis").
1226            (Exception-related definitions): Removed (moved to
1227            "lib/Message/Util/Error/DOMException.dis").
1228            (ForDef[ManakaiDOM:ForIF, ManakaiDOM:ForClass]): Removed (moved
1229            to DISLang).
1230    
1231    2005-02-17  Wakaba  <wakaba@suika.fam.cx>
1232    
1233            * DOMMain.dis: Definitions for "ManakaiDOM:ManakaiDOMNodeObject" and
1234            "ManakaiDOM:ManakaiDOMNodeReference" are removed (moved to
1235            "lib/Message/Util/ManakaiNode.dis").
1236            (ResourceDef[ManakaiDOM:DataType]): Removed (moved to
1237            "lib/manakai/DISCore.dis").
1238            (ResourceTypeDef[ManakaiDOM:IF, ManakaiDOM:Class,
1239            ManakaiDOM:PrimitiveTypeClass]): Removed (moved to
1240            "lib/manakai/DISLang.dis").
1241    
1242    2005-02-16  Wakaba  <wakaba@suika.fam.cx>
1243    
1244            * DOMMain.dis (ForDef[ManakaiDOM:Perl]): Removed (moved to
1245            DISPerl module).
1246    
1247    2005-01-07  Wakaba  <wakaba@suika.fam.cx>
1248    
1249            * DOMCore.dis: Each "delete array-item" replaced to a "splice".
1250    
1251    2005-01-06  Wakaba  <wakaba@suika.fam.cx>
1252    
1253            * DOMMain.dis (ensureXMLName): Test as if XML 1.0 if it is not an
1254            XML document.
1255    
1256    2005-01-05  Wakaba  <wakaba@suika.fam.cx>
1257    
1258            * DOMMain.dis (ManakaiDOMExceptionOrWarning.stringify): New method.
1259            (IntMethod[isExternallyReferred]): Rewritten.
1260            (IntMethod[isExternallyReferredDownward]): Removed.
1261            (Checking XML name legallity): Fix true or false mistakes.
1262            (destroy, importTree, orphanate): Rewritten.
1263            (destroyDownward, changeTreeIDDownward): Removed.
1264            (TreeCore:urefnode property): Removed since not used.
1265    
1266            * DOMCore.dis: Tying array for NodeList implemented.
1267    
1268    2005-01-02  Wakaba  <wakaba@suika.fam.cx>
1269    
1270            * DOMHTML.dis (HTMLDOMImplementation): New interface.
1271    
1272            * DOMViews.dis: Documentation for properties are added.
1273    
1274    2004-12-29  Wakaba  <wakaba@suika.fam.cx>
1275    
1276            * Makefile: DOMXML, DOMEvents, DOMLS and ManakaiDOMLS2003 added.
1277    
1278            * ManakaiDOMCore.dis: Removed (merged with DOMCore.dis).
1279    
1280    2004-12-28  Wakaba  <wakaba@suika.fam.cx>
1281    
1282            * ManakaiDOMXML.dis: Removed (merged with DOMXML.dis).
1283    
1284    2004-12-01  Wakaba  <wakaba@suika.fam.cx>
1285    
1286            * ManakaiDOMMain.dis: Removed (merged with DOMMain.dis).
1287    
1288    2004-11-03  Wakaba  <wakaba@suika.fam.cx>
1289    
1290            * .cvsignore: Ignore pod files.
1291    
1292    2004-10-31  Wakaba  <wakaba@suika.fam.cx>
1293    
1294            * DOMXML.dis (ProcessingInstruction.data): Property name error fixed.
1295    
1296            * DOMMain.dis: Don't call DOMString->__INT{length}__ - it should
1297            be DOMString->length.
1298    
1299            * DOMCore.dis (Element.getElementsByTagName,
1300            Node.getElementsByTagName, Element.getElementsByTagNameNS,
1301            Node.getElementsByTagNameNS): Implemented.
1302            (Element.getAttributeNode, Element.getAttributeNodeNS):
1303            Check whether defined.
1304    
1305    2004-10-18  Wakaba  <wakaba@suika.fam.cx>
1306    
1307            * DOMWebForms.dis: New module.
1308    
1309    2004-10-17  Wakaba  <wakaba@suika.fam.cx>
1310    
1311            * DOMBasicEvents.dis, DOMHTMLEvents.dis, DOMViews.dis,
1312            DOMHTML.dis: New modules.
1313    
1314    2004-10-16  Wakaba  <wakaba@suika.fam.cx>
1315    
1316            * DOMMouseEvents.dis, DOMTextEvents.dis: New module.
1317    
1318  2004-10-11  Wakaba  <wakaba@suika.fam.cx>  2004-10-11  Wakaba  <wakaba@suika.fam.cx>
1319    
1320          * ManakaiDOMMain.dis: 'TreeCore:anydata2' property type added.          * ManakaiDOMMain.dis: 'TreeCore:anydata2' property type added.

Legend:
Removed from v.1.31  
changed lines
  Added in v.1.150

admin@suikawiki.org
ViewVC Help
Powered by ViewVC 1.1.24