Customer Information Control System Question:

Code the related portions of CICS/COBOL-I programs to gain addressability to TWA area assigned to a particular task. Assme that the size of TWA area is 300 bytes. What are the advantages if COBOL-II is used in the place of COBOL?

Tweet Share WhatsApp

Answer:

Code the above requirement in COBOL-II.

AN: LINKAGE SECTION.
01 PARMLIST.
02 FILLER PIC S9(8) COMP.
02 TWA-PTR S(98) COMP.

01 TWA-DATA-LAYOUT.
02 DATA-AREA PIC x(300)

PROCEDURE DIVISION.
......
EXEC CICS ADDRESS
TWA(TWA-PTR)
END-EXEC
SERVISE RELOAD TWA-DATA-LAYOUT.

COBOL-II PROGRAM

LINKAGE SECTION
01 TWA-DATA-LAYOUT.
05 DATA-AREA PIC X(300).

PROCEDURE ADDRESS
......
EXEC CICS ADDRESS
TWA(ADDRESS OF TWA-DATA-LAYOUT)
END EXEC
....

Download CICS PDF Read All 194 CICS Questions
Previous QuestionNext Question
What does Pseudo Conversational mean?How and where is the TWA size set?