Server Guide


Call-out on MVS

For MVS, when passing parameters from Smalltalk to COBOL, or vice versa, you must correctly define the parameters in each application. The following table summarizes the more common data types.

Table 1. Smalltalk to COBOL parameter definition for MVS

Smalltalk parameter type Smalltalk class COBOL definition
pointer String PIC X.
pointer String PIC X(25).
int32 Integer PIC S9(9) COMP.
uint32 Integer PIC S9(9) COMP.
float Float COMP-2.
struct OSPtr
01 Structure.
02 A PIC X.
...
02 Z PIC X

For more information on call-out on MVS, see the following sections.


[ Top of Page | Previous Page | Next Page | Table of Contents | Index ]