AcuXML returns only data for one field on each read

0 Likes

Problem:

While using AcuXML to read (parse) XML records the data returned by the runtime on a read of the XML file was only the data for a single field with no file error being generated. The data for each subsequent field was accessible only by doing another read operation.

This is the COBOL source from the FILE SECTION:

FD  my_xml.

01  my_xml_record.

       03  fx1                        PIC X(50).

       03  fx2                        PIC X(50).

       03  fx3                        PIC X(50).

Resolution:

The initial XML file (see below) being parsed by AcuXML was missing the file tags.

  00

  000000009999

  0

Adding the missing file tags (compare example below) allowed each read to return the full data record.

  

    00

    000000006868

    0

  

Old KB# 3172
Comment List
Related
Recommended