TAL Programmer's Guide

Data Type Correspondence
F–2 096254 Tandem Computers Incorporated
Table F-1. Integer Types, Part 1
8-Bit Integer 16-Bit Integer 32-Bit Integer
BASIC STRING INT
INT(16)
INT(32)
C char [1]
unsigned char
signed char
int
short
unsigned
long
unsigned long
COBOL Alphabetic
Numeric DISPLAY
Alphanumeric-Edited
Alphanumeric
Numeric-Edited
PIC S9(n) COMP or PIC 9(n) COMP
without P or V, 1 n 4
Index Data Item [2]
NATIVE-2 [3]
PIC S9(n) COMP or PIC 9(n) COMP
without P or V, 5 n 9
Index Data Item [2]
NATIVE-4 [3]
FORTRAN INTEGER [4]
INTEGER*2
INTEGER*4
Pascal BYTE
Enumeration, unpacked,
256 members
Subrange, unpacked,
n…m, 0 n and
m 255
INTEGER
INT16
CARDINAL [1]
BYTE or CHAR value parameter
Enumeration, unpacked, > 256 members
Subrange, unpacked, n…m, -32,768 n
and m 32,767, 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
-32,768…32,767 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] Tandem COBOL85 only.
[4] INTEGER is normally equivalent to INTEGER*2. The INTEGER*4 and INTEGER*8 compiler directives redefine INTEGER.