Trillium ignores the following COBOL copybook features:
Any printer formatting information such as SKIP or PAGE
Currency symbols, padding characters, and thousands separators (treated as strings on import)
VALUE clause representing default values
INDEX clause
Descriptors such as RENAMES, JUSTIFIED, and SYNCHRONIZED
LEVEL 66, 77, and 88
POINTER
PIC 1
Trillium will not represent data correctly if there are occurrences of:
OCCURS DEPENDING clause
COMP-2, COMP-4, and COMP-5. (IBM-formatted COMP-2 data is supported by Trillium.)
Note: Although the data will not be displayed correctly, you could replace the COMP-2, 4, 5 copybook information with pictures such as
PIC X(n)
fields of the correct length. The benefit of making this change is that you would not have to remove the data from the data file. The fields can then be ignored at the loader preview stage—as long as the COMP-2,4,5 pictures have been replaced with PIC X(n)
fields of the correct length.Ensure that any instances of these unsupported copybook features are removed from the copybook and the data file matches any changes that are made to the copybook prior to creating Entities.