Start of change

COBOL source code differences in Enterprise COBOL Version 6

Start of changeStarting in Enterprise COBOL V6.1, ALLOCATE, DEFAULT, END-JSON, FREE, JSON, and JSON-CODE are new reserved words. Existing programs that use these words as user-defined words (for example, as data names or paragraph names) will get S-level diagnostic messages with Enterprise COBOL V6. You must change instances of these reserved words to other words such as ALLOCATE-X or JSON-Y, or you can use the CCCA utility to do it for you.End of change

Start of changeStarting in Enterprise COBOL V6.2, JSON-STATUS is a new reserved word. Existing programs that use JSON-STATUS as a user-defined word (for example, as a data name or paragraph name) will get S-level diagnostic messages with Enterprise COBOL V6.2. You must change these instances of JSON-STATUS to other words such as JSON-STATUS-X, or you can use the CCCA utility to do it for you.End of change

In Enterprise COBOL V5 and earlier versions, a non-88 level VALUE clause in the LINKAGE SECTION or FILE SECTION was treated as a comment. However, starting in Enterprise COBOL V6.1, the VALUE clause for LINKAGE SECTION and FILE SECTION items is now syntax checked and has meaning. This means that a program that is compiled with RC=0 with COBOL V5 could get RC=12 with COBOL V6.

For example, with Enterprise COBOL V5 and earlier versions:
  000224          LINKAGE SECTION.                                                           
  000225            01 ALPH-ITEM  PIC X(4)  VALUE 1234.                                      
                                                                                                   
==000225==> IGYDS1158-I A non-level-88 "VALUE" clause was found in the 
"FILE SECTION" or "LINKAGE SECTION". The "VALUE" clause was treated as comments. 
With Enterprise COBOL V6:
  000224          LINKAGE SECTION.                                                           
  000225            01 ALPH-ITEM  PIC X(4)  VALUE 1234.                                      
                                                                                                   
==000225==> IGYGR1080-S A "VALUE" clause literal was not compatible with the data 
category of the subject data item. The "VALUE" clause was discarded.    
End of change