Option comparison
The following table describes the Enterprise COBOL V5 and V6 compiler options and installation options, and explains how the options compare with those in OS/VS COBOL, VS COBOL II, IBM® COBOL, and Enterprise COBOL V3 and V4.
For complete descriptions of the Enterprise COBOL V5 and V6 options, see the Enterprise COBOL for z/OS Programming Guide and the Enterprise COBOL for z/OS Customization Guide.
Option | Available in | Usage notes | |||||
---|---|---|---|---|---|---|---|
OS/VS | VS II | IBM COBOL | Enterprise COBOL V3 and V4 | Enterprise COBOL V5 | Enterprise COBOL V6 | ||
ADATA | X | X | X | X | Produces associated data file at compilation. NOADATA is the default. The Enterprise COBOL ADATA option replaces the COBOL/370 EVENTS option. | ||
ADV | X | X | X | X | X | X | Adds print control byte at beginning of records. ADV is the default. |
AFP | X | X | Controls
the compiler usage of the Additional Floating
Point (AFP) registers that are provided by z/Architecture® processors.
|
||||
ANALYZE | X** | Causes the compiler to check the syntax of embedded SQL and CICS® statements in addition to native COBOL statements. | |||||
ALOWCBL | X | X | X | X | X | Allows PROCESS or CBL statements in source programs. You can only specify this option at installation time. ALOWCBL is the default. | |
APOST | X | X | X | X | X | X | Specifies
apostrophe (') as delimiter
for literals. QUOTE is the default. In Enterprise COBOL, literals can be delimited with either quotation marks or apostrophes regardless of whether APOST or QUOTE is in effect. If APOST is used, the figurative constant QUOTE/QUOTES represents one or more apostrophe (') characters. |
ARCH | X | X | Specifies the machine architecture for which the executable program instructions are to be generated. ARCH(7) is the default. | ||||
ARITH | X | X | X | X | Sets the maximum number of digits
that you can specify for decimal data and affects the precision of
intermediate results. ARITH(COMPAT) is the default. With ARITH(COMPAT)
you can specify 18 digits in the PICTURE clause, fixed-point numeric
literals, and arguments to NUMVAL, NUMVAL-C and With ARITH(EXTEND)
you can specify 31 digits in the PICTURE clause, fixed-point numeric
literals, and arguments to NUMVAL, NUMVAL-C and |
||
AWO | X | X | X | X | X | Activates APPLY WRITE-ONLY processing for physical sequential files with VB format. NOAWO is the default. | |
BLOCK0 | X | X | X | Activates BLOCK CONTAINS 0 clause for all physical sequential files in the program that specify neither BLOCK CONTAINS nor RECORDING MODE U in the file description. | |||
BUF | X | Allocates buffer storage for compiler work data sets. In Enterprise COBOL, the BUFSIZE option replaces the OS/VS COBOL BUF option. | |||||
BUFSIZE | X | X | X | X | X | Allocates buffer storage for compiler work data sets. Three suboptions are available: BUFSIZE(nnnnn), BUFSIZE(nnnK), and BUFSIZE(4096). BUFSIZE(4096) is the default. BUFSIZE replaces the OS/VS COBOL BUF option. | |
CICS | X | X | X | X | Enables the integrated CICS translator capability and specifies CICS options. NOCICS is the default. | ||
CLIST | X | Produces a condensed PROCEDURE DIVISION
listing plus tables and program statistics. NOCLIST is the default.
The VS COBOL II, IBM COBOL, and Enterprise COBOL OFFSET option replaces the OS/VS COBOL CLIST option. |
|||||
CMPR2 | X | X | Specified
generation of IBM COBOL source
code compatible with VS COBOL
II Release 2 or other VS COBOL II CMPR2 behavior. NOCMPR2 is the default behavior which cannot be changed. NOCMPR2 specifies the full use of all IBM COBOL language features (including language extensions for object-oriented COBOL and improved interoperability with C programs).
|
||||
CODEPAGE | X | X | X | Specifies the code page used for encoding contents of alphanumeric and DBCS data items at run time as well as alphanumeric, national, and DBCS literals in a COBOL source program. CODEPAGE(1140) is the default. | |||
COMPILE | X | X | X | X | X | Requests
an unconditional full compilation.
Other options are NOCOMPILE and NOCOMPILE(W|E|S). The default is
NOCOMPILE(S). NOCOMPILE specifies unconditional syntax checking. NOCOMPILE(W|E|S) specify conditional syntax checking based on the severity of the error. COMPILE is equivalent to the OS/VS COBOL NOSYNTAX and NOCSYNTAX options. NOCOMPILE is equivalent to the OS/VS COBOL SYNTAX options. NOCOMPILE(W|E|S) is equivalent to the OS/VS COBOL CSYNTAX and SUPMAP options. |
|
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() COPYLOC compiler option
to add either a PDSE (or PDS ) dataset
or z/OS® UNIX directory
as an additional location to be searched for copy members during the
library phase.![]() |
COPYRIGHT | X | X | Use COPYRIGHT to place a string in the object module if the object module is generated. If the object is linked into a program object, the string is loaded into memory with that program object. | ||||
COUNT | X | Produces statement
execution summaries
at the end of program execution. Each statement is identified by procedure-name
and by statement number, and the number of times it was used is indicated.
A similar function is provided with Debug Tool. |
|||||
CURRENCY | X | X | X | X | Defines the default currency symbol.
When both the CURRENCY option and the CURRENCY SIGN clause are used
in a program, the symbol specified in the CURRENCY SIGN clause is
considered the currency symbol in a PICTURE clause when that symbol
is used. NOCURRENCY is the default and indicates that no alternate default currency sign is provided by the CURRENCY option. |
||
DATA(24)
DATA(31) |
X | X | X | X | X | Specifies whether reentrant program data areas are acquired above or below the 16-MB line. With DATA(24), reentrant programs data is acquired below the 16-MB line. With DATA(31), reentrant programs data is acquired above the 16-MB line. DATA(31) is the default. | |
DATEPROC | X | X | Enables the millennium language extensions of the COBOL compiler. Options consist of DATEPROC(FLAG), DATEPROC(NOFLAG), DATEPROC(TRIG), DATEPROC(NOTRIG) and NODATEPROC. | ||||
DBCS | X | X | X | X | X | Tells the
compiler to recognize DBCS
shift-in and shift-out codes. DBCS is the default. |
|
DBCSXREF=code | X | X | X | X | X | Specifies
that an ordering program
is to be used for cross-references to DBCS characters, where code
sets parameters giving information about the DBCS Ordering Support
Program. You can only specify DBCSXREF at installation time. DBCSXREF=NO is the default. |
|
DECK | X | X | X | X | X | X | Generates object code as 80-character card images and places it in SYSPUNCH file. NODECK is the default. |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
DIAGTRUNC | X | X | X | X | Causes the compiler to issue a severity-4 (warning) diagnostic message for MOVE statements with numeric receivers when the receiving data has fewer integer positions than the sending data item or literal. NODIAGTRUNC is the default. | ||
DISPSIGN | X | X | Controls output formatting for DISPLAY of signed numeric items. DISPSIGN(COMPAT) is the default. | ||||
DLL | X | X | X | X | Enables the compiler to generate an object module that is enabled for DLL (Dynamic Link Library) support. NODLL is the default. | ||
DMAP | X | Produces a listing of the DATA DIVISION
and implicitly declared items. NODMAP is the default. The VS COBOL II, IBM COBOL, and Enterprise COBOL MAP option replaces the OS/VS COBOL DMAP option. |
|||||
DUMP | X | X | X | X | X | X | Specifies that a system dump be produced at end of compilation. NODUMP is the default. |
DYNAM | X | X | X | X | X | X | Changes the behavior of CALL literal statements to load subprograms dynamically at run time. NODYNAM is the default. With NODYNAM, CALL literal statements cause subprograms to be statically link-edited in the program object. |
EXIT(INEXIT
(IN-id)) EXIT(LIBEXIT (LIB-id)) EXIT(PRTEXIT (PRT-id)) EXIT(ADEXIT (ADT-id)) EXIT(MSGEXIT (MSG-id)) |
X | X | X | X | X | Allows the compiler to accept user-supplied
modules. (Each string is an optional user-supplied
input string to the exit module, and each mod names
a user-supplied exit module.) The ADEXIT suboption is only available with COBOL for MVS™ & VM and later compilers. The MSGEXIT suboption is only available with Enterprise COBOL V4.2 and later compilers. NOEXIT is the default. |
|
EXPORTALL | X | X | X | X | Instructs the compiler to automatically export certain symbols when the object deck is link-edited to form a DLL. NOEXPORTALL is the default. | ||
FASTSRT | X | X | X | X | X | Specifies fast sorting by the IBM DFSORT licensed program. NOFASTSRT is the default, and specifies that Enterprise COBOL will do SORT or MERGE input/output. | |
FLAG | X | X | X | X | X | X | Specifies
that syntax messages are
produced at the level indicated. For OS/VS COBOL the FLAG options
are: FLAGW and FLAGE. For Enterprise COBOL, the FLAG options
are:
For VS COBOL II and IBM COBOL FLAG(I) is the default. For Enterprise COBOL, FLAG(I,I) is the default. |
FLAGMIG | X | X | X | Specifies NOCMPR2 flagging for possible semantic changes from VS COBOL II Release 2 or other programs with CMPR2 behavior. | |||
FLAGMIG4 | X**** | APAR PM93450 for Enterprise COBOL Version 4 Release
2 adds option FLAGMIG4 to identify language elements in Enterprise COBOL Version 4 programs
that are not supported, or that are supported differently in Enterprise COBOL Version 5 or Version 6. The compiler
will generate a warning diagnostic messages for all such language
elements. ![]() ![]() Note: The source
code changes for COBOL V5 and V6 are rarely used COBOL language features
and do not affect 99% of COBOL users.
|
|||||
FLAGSTD | X | X | X | X | X | Specifies 85 COBOL Standard flagging. For
COBOL for OS/390® & VM
and COBOL for MVS & VM, FLAGSTD
also flags language syntax for object-oriented COBOL, improved C interoperability,
and use of the PGMNAME(LONGMIXED) compiler option. NOFLAGSTD is the default. |
|
FDUMP | X | Produces a
dump with debugging information
when an application ends with an abend. NOFDUMP is the default. The Enterprise COBOL TEST option replaces the VS COBOL II FDUMP option. |
|||||
HGPR | X | X | Controls the compiler usage of the 64-bit registers provided by z/Architecture processors. HGPR(PRESERVE) is the default. | ||||
![]() ![]() |
X******** | ![]() ![]() |
|||||
IDLGEN | X | In addition to the normal compile of the COBOL source file, IDLGEN generates IDL definitions for defined classes. NOIDLGEN is the default. | |||||
INTDATE | X | X | X | X | Determines the starting date for integer
format dates when used with date intrinsic functions. INTDATE(ANSI)
uses 85 COBOL Standard starting
date, where Day 1 = January 1, 1601. INTDATE(LILIAN) uses the Language Environment® Lilian starting
date, where Day 1 = October 15, 1582. INTDATE(ANSI) is the default. |
||
LANGUAGE | X | X | X | X | X | LANGUAGE(AAa...a)
specifies language
in which compiler messages are issued, where AAa...a is:
LANGUAGE=(EN) is the default. |
|
LIB | X | X | X | X | Specifies that the program uses the COPY library. | ||
LINECNT=nn | X | Specifies the number of lines per page on the output listing. For VS COBOL II, IBM COBOL, and Enterprise COBOL, the LINECOUNT compiler option replaces the OS/VS COBOL LINECNT option. | |||||
LINECOUNT | X | X | X | X | X | Specifies
the number of lines per
page on the output listing. The two formats for LINECOUNT are: LINECOUNT(60)
and LINECOUNT(nn). LINECOUNT(60) is the default. LINECOUNT replaces the OS/VS COBOL LINECNT option. |
|
LIST | X | X | X | X | X | Produces a listing of assembler language
expansion of source code. NOLIST is the default. LIST replaces the OS/VS COBOL PMAP option. |
|
LOAD | X | Stores object code on disk or tape
for input to linkage-editor. NOLOAD is default. The VS COBOL II, IBM COBOL, and Enterprise COBOL OBJECT option replaces the OS/VS COBOL LOAD option. |
|||||
MAP | X | X | X | X | X | Produces a listing of the DATA DIVISION
and implicitly declared items. NOMAP is the default. MAP replaces the OS/VS COBOL DMAP option. In Enterprise COBOL V5.1 with the latest service installed, and Enterprise COBOL V5.2 and V6, new suboptions HEX and DEC are added to control whether hexadecimal or decimal offsets are shown for MAP output in the compiler listing. Enterprise COBOL V5.1 at base level always produced MAP output with decimal offsets, while earlier compilers all produced MAP output with hexadecimal offsets. If MAP is specified with no suboption, it will be accepted as MAP(HEX). This will give you the same behavior in Enterprise COBOL V5 and V6 as in earlier COBOL compilers. |
|
MAXPCF(n) | X | X | Instructs
the compiler not to optimize code if
the program contains a complexity factor greater than n. ![]() ![]() |
||||
MDECK | X | X | X | Causes output from the library processing (the expansion of COPY, BASIS, REPLACE, and EXEC SQL INCLUDE statements) to be written to a file. NOMDECK is the default. | |||
NAME | X | X | X | X | X | X | Indicates
that a linkage-editor NAME
statement is appended to each object module created. For VS COBOL
II, IBM COBOL, and Enterprise COBOL, NAME has the
suboptions (ALIAS|NOALIAS). If ALIAS is specified, an ALIAS statement
is also generated for each ENTRY statement NONAME is the default. |
NSYMBOL | X | X | X | Controls
the interpretation of the "N" symbol used
in literals and picture clauses, indicating whether national or DBCS
processing is assumed. NSYMBOL(NATIONAL) is the default. |
|||
NUM | X | Prints line numbers in error messages
and listings. NONUM is the default. The VS COBOL II, IBM COBOL, and Enterprise COBOL NUMBER option replaces the OS/VS COBOL NUM option. |
|||||
NUMBER | X | X | X | X | X | Prints line
numbers in error messages
and listings. NONUMBER is the default. The NUMBER option replaces the OS/VS COBOL NUM option. |
|
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() SIZE
ERROR checking for binary data items.
![]() |
NUMCLS | X | X | X | X | X | Determines,
together with the NUMPROC
option, valid sign configurations for numeric items in the NUMERIC
class test. NUMCLS has two suboptions: (PRIM/ALT). NUMCLS(PRIM) is
the default. You can specify NUMCLS only at installation time. For more information, see the Enterprise COBOL for z/OS Customization Guide. |
|
NUMPROC | X | X | X | X | X | Handles packed/zoned
decimal signs
as follows:
NUMPROC(NOPFD) is the default. |
|
OBJECT | X | X | X | X | X | Stores object
code on disk or tape
for input to linkage-editor. OBJECT is the default. OBJECT replaces the OS/VS COBOL LOAD option. |
|
OFFSET | X | X | X | X | X | Produces a condensed PROCEDURE DIVISION
listing plus tables and program statistics. NOOFFSET is the default.
OFFSET replaces the OS/VS COBOL CLIST option. |
|
OPTFILE | X | X | X | Specifies that compiler options should be read from a separate data set or file specified by a SYSOPTF DD statement. OPTFILE is not in effect by default. | |||
OPTIMIZE | X | X | X | X | X | X | Optimizes the object program. With IBM COBOL and Enterprise COBOL prior to V5, OPTIMIZE had the suboptions of (STD/FULL). The default was NOOPTIMIZE. In Enterprise COBOL V5 and V6, OPTIMIZE has the suboptions of (0 / 1 / 2). The OPTIMIZE option specifies increasing levels of optimization to improve application runtime performance.
|
OUTDD(SYSOUT)
OUTDD(ddname) |
X | X | X | X | X | Routes DISPLAY
output to SYSOUT or
to a specified data set. OUTDD(SYSOUT) is the default. OUTDD replaces the OS/VS COBOL SYSx option. |
|
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() NOPARMCHECK is the default. ![]() |
PGMNAME | X | X | X | X | Controls
the handling of program names
in relation to length and case.
PGMNAME(COMPAT) is the default. |
||
PMAP | X | Produces a
listing of assembler language
expansion of source code. The VS COBOL II, IBM COBOL, and Enterprise COBOL LIST compiler option replaces the OS/VS COBOL PMAP option. |
|||||
QUALIFY | X | X | QUALIFY affects qualification rules and controls whether to extend qualification rules so that some data items that cannot be referenced under COBOL Standard rules can be referenced. | ||||
QUOTE | X | X | X | X | X | X | Specifies
a quotation mark (") as
the delimiter for literals. QUOTE is the default. In Enterprise COBOL, literals can be delimited with either quotation marks or apostrophes regardless of whether APOST or QUOTE is in effect. If QUOTE is used, the figurative constant QUOTE/QUOTES represents one or more quotation marks (") characters. |
RES | X | X | Causes most library routines to be loaded dynamically, instead of being link-edited with the COBOL program. RES is the default behavior and is not changeable. | ||||
RENT | X | X | X | X | X | Specifies reentrant code in object program. RENT is the default. | |
RMODE(AUTO)
RMODE(24) RMODE(ANY) |
X | X | X | X | Establishes the residency mode for the generated object program. Programs compiled with NORENT will have RMODE(24). Programs compiled with RENT will have RMODE(ANY). RMODE(AUTO) is the default. | ||
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
SEQ | X | Checks ascending sequencing of source
statement line numbers. The VS COBOL II, IBM COBOL, and Enterprise COBOL SEQUENCE option replaces the OS/VS COBOL SEQ option. |
|||||
SEQUENCE | X | X | X | X | X | Checks ascending
sequencing of source
statement line numbers. SEQUENCE is the default. SEQUENCE replaces the OS/VS COBOL SEQ option. |
|
SERVICE | X | X | Use SERVICE to place a string in the object module if the object module is generated. If the object module is linked into a program object, the string is loaded into memory with this program object. If the Language Environment dump includes a traceback, this string is included in that traceback. | ||||
SIZE(MAX)
SIZE(nnnnn) SIZE(nnnK) |
X | X | X | X***** | Specifies virtual storage to be used for compilation. | ||
SOURCE | X | X | X | X | X | X | Produces a listing of the source program and embedded messages. SOURCE is the default. |
SPACE | X | X | X | X | X | X | Produces
a single, double, or triple
spaced listing. The syntax of the SPACE option in OS/VS COBOL is:
SPACE1, SPACE2, SPACE3. The syntax of SPACE in VS COBOL II and Enterprise COBOL is: SPACE(1),
SPACE(2), SPACE(3). SPACE(1) is the default. |
SQL | X | X | X | X | Enables the Db2® coprocessor capability and specifies Db2 suboptions. NOSQL is the default. | ||
SQLIMS | X | X | Enables the IMS SQL coprocessor capability and specifies IMS suboptions. NOSQLIMS is the default. | ||||
SQLCCSID | X | X | X | Determines
whether the CODEPAGE compiler option influences the processing of
SQL
statements in COBOL programs. Has an effect only when the integrated Db2 coprocessor (SQL compiler option)
is used. SQLCCSID is the default. |
|||
SSRANGE | X | X | X | X | X | At run time,
checks validity of subscript,
index, and reference modification references.
In Enterprise COBOL V6.1, new suboptions ZLEN and NOZLEN are added to control how the compiler checks reference modification lengths. NOSSRANGE is the default. |
|
STGOPT | X | X | Controls storage optimization. NOSTGOPT is the default. | ||||
SUPPRESS | X | Controls whether to ignore the SUPPRESS phrase of COPY statements. | |||||
SYSx | X | Routes DISPLAY
output to SYSOUT or
to a specified data set. The VS COBOL II, IBM COBOL, and Enterprise COBOL OUTDD option replaces the OS/VS COBOL SYSx option. |
|||||
STATE | X | Produces a dump with debugging information
when an application ends with an abend. The IBM Enterprise COBOL TEST option replaces the OS/VS COBOL STATE option. |
|||||
SUPMAP
SYNTAX CSYNTAX |
X | Specifies the extent of compilation.
SYNTAX specifies unconditional syntax checking. CSYNTAX and CSUPMAP
specify conditional syntax checking. NOSYNTAX and NOCSYNTAX specify
an unconditional full compile. The VS COBOL II, IBM COBOL, and Enterprise COBOL COMPILE option replaces the OS/VS COBOL SYNTAX, CSYNTAX, and CSUPMAP options. |
|||||
SYMDMP | X | Produces a symbolic dump. ABEND dumps and dynamic dumps are available through Language Environment services. Symbolic dumps are available by using the TEST compiler option. |
|||||
SXREF | X | Produces sorted cross-reference listing
of data names and procedure names used in program. The VS COBOL II, IBM COBOL, and Enterprise COBOL XREF option replaces the OS/VS COBOL SXREF option. |
|||||
TERM | X | Sends progress messages to the SYSTERM
data set. The VS COBOL II, IBM COBOL, and Enterprise COBOL TERMINAL option replaces the OS/VS COBOL TERM option. |
|||||
TERMINAL | X | X | X | X | X | Sends progress
messages to the SYSTERM
data set. NOTERMINAL is the default. TERMINAL replaces the OS/VS COBOL TERM option. |
|
TEST | X | X | X | X | X | X | Produces
object code usable by Debug
Tool for the product. ![]() ![]() For details, see TEST. |
THREAD | X | X | X | Enables a COBOL program for execution in a run unit with multiple POSIX threads or PL/I tasks. NOTHREAD is the default. | |||
TRUNC | X | X | X | X | X | X | Truncates
final intermediate results.
OS/VS COBOL has the TRUNC and NOTRUNC options (NOTRUNC is the default).
VS COBOL II, IBM COBOL, and Enterprise COBOL have the TRUNC(STD|OPT|BIN)
option.
TRUNC(STD) is the default. For a complete description, see the Enterprise COBOL for z/OS Programming Guide. |
TYPECHK | X | Enforces the
rules for OO type conformance
and issues diagnostics for any violations. NOTYPECHK is the default. |
|||||
VBREF
VBSUM |
X |
X
|
X
|
X
|
X
|
X | Produces a cross-reference listing
of all statement types used in program. Only OS/VS COBOL supports
VBSUM. NOVBREF is the default. |
VLR | X****** | X | Affects the file status returned from READ statements for variable-length records when the length of record returned is inconsistent with the record descriptions. | ||||
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() |
![]() ![]() ![]() ![]() |
![]() ![]() |
![]() ![]() |
WORD | X | X | X | X | X | Tells the
compiler which reserved
word table to use. To use an installation-specific reserved word table,
specify WORD(table-name). To use the default reserved word table,
specify NOWORD. NOWORD is the default. |
|
XMLPARSE | X*** | X****** | X | For Enterprise COBOL Version 4 and later only (available in Enterprise COBOL Version 5.1 via service). Selects which XML parser is to be used, either the z/OS XML System Services parser (XMLSS) or the COBOL high-speed parser that was used in Enterprise COBOL Version 3. The default is XMLPARSE(XMLSS). | |||
XREF | X | X | X | X | X | Produces
a sorted cross-reference
listing of data names and procedure names used in program. The default
is XREF. XREF replaces the OS/VS COBOL SXREF option. |
|
YEARWINDOW | X | X | Specifies the first year of the 100-year window (the century window) to be applied to windowed date field processing by the COBOL compiler. YEARWINDOW(1900) is the default. | ||||
ZONECHECK | X****** | X | Tells the compiler to
generate IF NUMERIC class
tests for zoned decimal data items that are used as sending data items.
|
||||
ZONEDATA | X****** | X | Tells the compiler
whether data in USAGE DISPLAY ![]() PACKED-DECIMAL ![]() |
||||
ZWB | X | X | X | X | X | X | Removes the sign from a signed numeric DISPLAY field when comparing it with an alphanumeric field. ZWB is the default. |
|