Changes in GC14-7383-03 (March 2019)

Start of change

Changes in GC14-7383-03 (March 2019)

End of change
Start of change

Changes in GC14-7383-03 (September 2018)

  • Added information about two new suboptions ALPHNUM and NOALPHNUM of the NUMCHECK(ZON) compiler option, which control whether the compiler will generate code for an implicit numeric class test for zoned decimal data items that are being compared with an alphanumeric data item, alphanumeric literal or alphanumeric figurative constant. The changes are introduced in Enterprise COBOL Version 5 Release 2 with PTF for APAR PH01241 installed.
  • Added information about how to find WORKING-STORAGE SECTION in Enterprise COBOL V5. For details, see WORKING-STORAGE SECTION changes.
End of change
Start of change

Changes in GC14-7383-03 (July 2018)

  • Replaced the Edge Portfolio Analyzer with a free and open source COBOL Analyzer. For details, see Free and open source COBOL Analyzer.
  • Clarified that compiler migration is required for OS/VS COBOL programs and VS COBOL II programs compiled with NORES in Compiler migration.
End of change
Start of change

Changes in GC14-7383-03 (May 2018)

End of change
Start of change

Changes in GC14-7383-03 (November 2017)

End of change
Start of change

Changes in GC14-7383-03 (September 2017)

  • Added information about a new VSAMOPENFS compiler option that affects the user file status reported from successful VSAM OPEN statements that require verified file integrity check. The VSAMOPENFS option is introduced in Enterprise COBOL Version 5 Release 2 with PTF for APAR PI85868 installed.
  • Added information about two new suboptions MSG and ABD of the SSRANGE compiler option, which control the runtime behavior of the COBOL program when a range check fails. MSG and ABD are introduced in Enterprise COBOL Version 5 Release 2 with PTF for APAR PI86343 installed.
End of change
Start of change

Changes in GC14-7383-03 (June 2017)

  • Added information about a new NUMCHECK compiler option that controls whether to generate extra code to validate data items when they are used as sending data items. The NUMCHECK option is introduced in Enterprise COBOL Version 5 Release 2 with PTF for APAR PI81006 installed.
End of change
Start of change

Changes in GC14-7383-03 (April 2017)

End of change
Start of change

Changes in GC14-7383-03 (January 2017)

End of change
Start of change

Changes in GC14-7383-03 (September 2016)

  • Added information about a new INITCHECK compiler option that controls whether to check for uninitialized data items and issue warning messages when they are used without being initialized. The INITCHECK option is introduced in Enterprise COBOL Version 5 Release 2 with PTF for APAR PI69197 installed.
End of change

Changes in GC14-7383-03 (July 2015)

Added information about compiler option changes:
  • New option: ZONECHECK(MSG|ABD)
  • Modified option: ZONEDATA. New suboption of NOPFD is added to the ZONEDATA compiler option. ZONEDATA(NOPFD) lets the compiler generate code that performs comparisons of zoned decimal data in the same manner as COBOL V4 does when using NUMPROC(NOPFD|PFD) with COBOL V4.

Changes in GC14-7383-03 (February 2015)

  • Added information about Enterprise COBOL V5.2 changes to the chapter "What is new and different with Enterprise COBOL Version 5", and the changes mainly fall into the following topics:
    • Source code differences
    • Compiler options changes
    • Compilation restrictions for user-written condition handlers
    • Variable length records - wrong length READ
    • Using object oriented COBOL or interoperating with C programs
  • Added information about upgrading Enterprise COBOL Version 3 or Version 4 programs that have XML PARSE statements
  • Added information about accessing VSAM data sets with the extended addressability attribute, including for existing COBOL programs compiled with earlier versions than Enterprise COBOL for z/OS, V5.2.
  • Added information to appendix on how to save and restore the high halves of General Purpose Registers (GPRs) in assembler programs that will call or be called by Enterprise COBOL V5.