Pathway/iTS SCREEN COBOL Reference Manual (G06.24+, H06.03+, Pathway/iTS 1.0+)

Data Type Correspondence and Return Value Sizes
Compaq NonStop™ Pathway/iTS SCREEN COBOL Reference Manual426750-001
F-2
Pascal BYTE
Enumeration,
unpacked,
ð 256 members
Subrange, unpacked,
n…m, 0 ð n and
255
INTEGER
INT16
CARDINAL [1]
BYTE or CHAR value
parameter
Enumeration, unpacked,
> 256 members
Subrange, unpacked,
n…m, -32768
ð n and m ð 32767,
but at least n or m
outside 0…255 range
LONGINT
INT32
Subrange, unpacked
n…m,
–2147483648 ð n and
m ð 2147483647,
but at least n or m
outside -32768…
32767 range
SQL CHAR NUMERIC(1)…
NUMERIC(4)
PIC 9(1) COMP…
PIC 9(4) COMP
SMALLINT
NUMERIC(5)…
NUMERIC(9)
PIC 9(1) COMP…
PIC 9(9) COMP
INTEGER
TAL STRING
UNSIGNED(8)
INT
UNSIGNED(16)
INT(32)
Return
Value
Size
(Words)
11 2
[1] Unsigned Integer.
[2] Index Data Item is a 16-bit integer in COBOL 74 and a 32-bit integer in COBOL85.
[3] COBOL85 only.
[4] INTEGER is normally equivalent to INTEGER*2. The INTEGER*4 and INTEGER*8 compiler directives
redefine INTEGER.
Table F-2. Integer Types, Part 2 (page 1 of 2)
64-Bit Integer
Bit Integer of 1 to
31 Bits Decimal Integer
C long long
COBOL PIC S9(n) COMP or
PIC 9(n) COMP
without P or V,
10 ð n ð 18
NATIVE-8 [1]
Numeric DISPLAY
FORTRAN INTEGER*8
[1] COBOL85 only.
Pascal INT64 UNSIGNED(n),
1 ð n ð 16
INT(n), 1 ð n ð 16
DECIMAL
Table F-1. Integer Types, Part 1 (page 2 of 2)
8-Bit Integer 16-Bit Integer 32-Bit Integer