Cobol-Tutorial - Mainframe Refresher
Cobol-Tutorial - Mainframe Refresher
Cobol-Tutorial - Mainframe Refresher
History.
Developed in 1959 by a group called COnference on Data Systems Language
(CODASYL). First COBOL compiler was released by December 1959.
Speciality.
1. First language developed for commercial application development, which can
efficiently handle millions of data.
2. Procedure Oriented Language - Problem is segmented into several tasks.
Each task is written as a Paragraph in Procedure Division and executed in a
logical sequence as mentioned.
3. English Like language – Easy to learn, code and maintain.
Coding Sheet.
1 7 12 72 80
COL-A COLUMN-B
Language Structure.
Divisions in COBOL.
There are four divisions in a COBOL program and Data division is optional.
1. Identification Division.
2. Environment Division.
3. Data Division.
4. Procedure Division.
Identification Division.
This is the first division and the program is identified here. Paragraph
PROGRAM-ID followed by user-defined name is mandatory. All other paragraphs are
optional and used for documentation. The length of user-defined name for IBM
COBOL is EIGHT.
IDENTIFICATION DIVISION.
PROGRAM-ID. PROGRAM NAME.
AUTHOR. COMMENT ENTRY.
INSTALLATION. COMMENT ENTRY.
DATE-WRITTEN. COMMENT ENTRY.
DATE-COMPILED. COMMENT ENTRY.
SECURITY. COMMENT ENTRY.
Security does not pertain to the operating system security, but the
information that is passed to the user of the program about the security features of
the program.
Environment Division.
Only machine dependant division of COBOL program. It supplies information
about the hardware or computer equipment to be used on the program. When your
program moves from one computer to another computer, the only section that may
need to be changed is ENVIRONMENT division.
Configuration Section.
It supplies information concerning the computer on which the program will be
compiled (SOURCE-COMPUTER) and executed (OBJECT-COMPUTER). It consists of
three paragraphs – SOURCE COMPUTER, OBJECT-COMPUTER and SPECIAL-NAMES.
This is OPTIONAL section from COBOL 85.
Input-Output Section.
It contains information regarding the files to be used in the program and
it consists of two paragraphs FILE-CONTROL & I-O CONTROL.
FILE CONTROL. Files used in the program are identified in this paragraph.
I-O CONTROL. It specifies when check points to be taken and storage areas that are
shared by different files.
Data Division.
Data division is used to define the data that need to be accessed by the
program. It has three sections.
FILE SECTION describes the record structure of the files.
WORKING-STORAGE SECTION is used to for define intermediate variables.
LINKAGE SECTION is used to access the external data.
Ex: Data passed from other programs or from
PARM of JCL.
Declaration of variable
Level# $ Variable $ Picture clause $ Value clause $ Usage Clause $ Sync clause.
FILLER
Level#
It specifies the hierarchy of data within a record. It can take a value from the
set of integers between 01-49 or from one of the special level-numbers 66 77 88
FILLER
When the program is not intended to use selected fields in a record structure,
define them as FILLER. FILLER items cannot be initialized or used in any operation of
the procedure division.
PICTURE Clause
Describes the attributes of variable.
DBCS (Double Byte Character Set) is used in the applications that support large
character sets. 16 bits are used for one character. Ex: Japanese language
applications.
Refreshing Basics
Nibble. 4 Bits is one nibble. In packed decimal, each nibble stores one digit.
Byte. 8 Bits is one byte. By default, every character is stored in one byte.
Half word. 16 bits or 2 bytes is one half word. (MVS)
Full word. 32 bits or 4 bytes is one full word. (MVS)
Double word. 64 bits or 8 bytes is one double word. (MVS)
Usage Clause
DISPLAY Default. Number of bytes required equals to the size of the data item.
COMP Binary representation of data item.
PIC clause can contain S and 9 only.
S9(01) – S9(04) Half word. Takes 2 bytes
S9(05) – S9(09) Full word. Takes 4 byte
S9(10) - S9(18) Double word. Takes 8 byte
Most significant bit is ON if the number is negative.
COMP-1 Single word floating point item. PIC Clause should not be specified.
COMP-2 Double word floating-point item. PIC Clause should not be specified.
COMP-3 Packed Decimal representation. Two digits are stored in each byte.
Last nibble is for sign. (F for unsigned positive, C for signed positive
And D for signed negative)
Formula for Bytes: Integer ((n/2) + 1)) => n is number of 9s.
INDEX It is used for preserve the index value of an array. PIC Clause should
not be specified.
Mainframe Refresher Part-1 COBOL-Page: 5
VALUE Clause
It is used for initializing data items in the working storage section. Value of
item must not exceed picture size. It cannot be specified for the items whose size is
variable.
Syntax: VALUE IS literal.
VALUES ARE literal-1 THRU | THROUGH literal-2
VALUES ARE literal-1, literal-2
Literal can be numeric without quotes OR non-numeric within quotes OR figurative
constant.
SIGN Clause
Syntax SIGN IS (LEADING) SEPARATE CHARACTER (TRAILING).
It is applicable when the picture string contain ‘S’. Default is TRAILING WITH NO
SEPARATE CHARACTER. So ‘S’ doesn’t take any space. It is stored along with last
digit.
01 WS-TEST.
10 WS-VAR1 PIC X(02).
10 WS-VAR2 PIC S9(6) COMP SYNC.
REDEFINES
The REDEFINES clause allows you to use different data description entries to
describe the same computer storage area. Redefining declaration should immediately
follow the redefined item and should be done at the same level. Multiple
redefinitions are possible. Size of redefined and redefining need not be the same.
Example:
01 WS-DATE PIC 9(06).
01 WS-REDEF-DATE REDEFINES WS-DATE.
05 WS-YEAR PIC 9(02).
05 WS-MON PIC 9(02).
Mainframe Refresher Part-1 COBOL-Page: 6
RENAMES
It is used for regrouping of elementary data items in a record. It should be
declared at 66 level. It need not immediately follows the data item, which is being
renamed. But all RENAMES entries associated with one logical record must
immediately follow that record's last data description entry. RENAMES cannot be
done for a 01, 77, 88 or another 66 entry.
01 WS-REPSONSE.
05 WS-CHAR143 PIC X(03).
05 WS-CHAR4 PIC X(04).
66 ADD-REPSONSE RENAMES WS-CHAR143.
CONDITION name
It is identified with special level ‘88’. A condition name specifies the value that
a field can contain and used as abbreviation in condition checking.
01 SEX PIC X.
88 MALE Values ‘1’
88 FEMALE VALUE ‘2’ ‘3’.
IF SEX=1 can also be coded as IF MALE in Procedure division.
‘SET FEMALE TO TRUE ‘ moves value 2 to SEX. If multiple values are coded on
VALUE clause, the first value will be moved when it is set to true.
JUSTIFIED RIGHT
This clause can be specified with alphanumeric and alphabetic items for right
justification. It cannot be used with 66 and 88 level items.
OCCURS Clause
OCCURS Clause is used to allocate physically contiguous memory locations to
store the table values and access them with subscript or index. Detail explanation is
given in Table Handling section.
LINKAGE SECTION
It is used to access the data that are external to the program. JCL can send
maximum 100 characters to a program thru PARM. Linkage section MUST be
coded with a half word binary field, prior to actual field. If length field is not coded,
the first two bytes of the field coded in the linkage section will be filled with length
and so there are chances of 2 bytes data truncation in the actual field.
01 LK-DATA.
05 LK-LENGTH PIC S9(04) COMP.
05 LK-VARIABLE PIC X(08).
LINKAGE section of sub-programs will be explained later.
Mainframe Refresher Part-1 COBOL-Page: 7
Procedure Division.
This is the last division and business logic is coded here. It has user-defined
sections and paragraphs. Section name should be unique within the program and
paragraph name should be unique within the section.
MOVE Statement
It is used to transfer data between internal storage areas defined in either file
section or working storage section.
Syntax:
MOVE identifier1/literal1/figurative-constant TO identifier2 (identifier3)
Multiple move statements can be separated using comma, semicolons, blanks
or the keyword THEN.
ARITHMETIC VERBS
All the possible arithmetic operations in COBOL using ADD, SUBTRACT,
MULTIPLY and DIVIDE are given below:
Arithmetic Operation A B C D
ADD A TO B A A+B
ADD A B C TO D A B C A+B+C+D
ADD A B C GIVING D A B C A+B+C
ADD A TO B C A A+B A+C
SUBTRACT A FROM B A B-A
SUBTRACT A B FROM A B C-(A+B)
C
SUBTRACT A B FROM A B C C-(A+B)
C GIVING D
MULTIPLY A BY B A A*B
MULTIPLY A BY B A B A*B
GIVING C
DIVIDE A INTO B A B/A
DIVIDE A INTO B A B B/A
GIVING C
DIVIDE A BY B A B A/B
GIVING C
DIVIDE A INTO B A B Integer (B/A) Integer
GIVING C remainder
REMAINDER D
ROUNDED option
With ROUNDED option, the computer will always round the result to the
PICTURE clause specification of the receiving field. It is usually coded after the field
to be rounded. It is prefixed with REMAINDER keyword ONLY in DIVIDE operation.
ADD A B GIVING C ROUNDED.
DIVIDE..ROUNDED REMAINDER
Caution: Don’t use for intermediate computation.
ON SIZE ERROR
If A=20 (PIC 9(02)) and B=90 (PIC 9(02)), ADD A TO B will result 10 in B
where the expected value in B is 110. ON SIZE ERROR clause is coded to trap such
size errors in arithmetic operation.
If this is coded with arithmetic statement, any operation that ended with SIZE
error will not be carried out but the statement follows ON SIZE ERROR will be
executed.
ADD A TO B ON SIZE ERROR DISPLAY ‘ERROR!’.
COMPUTE
Complex arithmetic operations can be carried out using COMPUTE statement.
We can use arithmetic symbols than keywords and so it is simple and easy to code.
+ For ADD, - for SUBTRACT, * for MULTIPLY, / for DIVIDE and ** for exponentiation.
Rule: Left to right – 1.Parentheses
2.Exponentiation
3.Multiplication and Division
4.Addition and Subtraction
Caution: When ROUNDED is coded with COMPUTE, some compiler will do rounding
for every arithmetic operation and so the final result would not be precise.
All arithmetic operators have their own explicit scope terminators. (END-ADD,
END-SUBTRACT, END-MULTIPLY, END-DIVIDE, END-COMPUTE). It is suggested to
use them.
CORRESPONDING is available for ADD and SUBTRACT only.
INITIALIZE
VALUE clause is used to initialize the data items in the working storage
section whereas INITIALIZE is used to initialize the data items in the procedure
division.
INITIALIZE sets the alphabetic, alphanumeric and alphanumeric-edited items
to SPACES and numeric and numeric-edited items to ZERO. This can be overridden
by REPLACING option of INITIALIZE. FILLER, OCCURS DEPENDING ON items are not
affected.
Mainframe Refresher Part-1 COBOL-Page: 10
DISPLAY
It is used to display data. By default display messages are routed to SYSOUT.
Syntax: DISPLAY identifier1| literal1 (UPON mnemonic name)
Collating Sequence
There are two famous Collating Sequence available in computers. IBM and
IBM Compatible machine use EBCDIC collating sequence whereas most micro and
many mainframe systems use ASCII collating sequence. The result of arithmetic and
alphabetic comparison would be same in both collating sequences whereas the same
is not true for alphanumeric comparison.
IF/THEN/ELSE/END-IF
The most famous decision making statement in all language is ‘IF’. The syntax
of IF statement is given below: IF can be coded without any ELSE statement. THEN
is a noise word and it is optional.
If ORs & ANDs are used in the same sentence, ANDs are evaluated first from
left to right, followed by ORs. This rule can be overridden by using parentheses.
The permitted relation conditions are =, <, >, <=, >=, <>
CONTINUE is no operation statement. The control is just passed to next
STATEMENT. NEXT SENTENCE passes the control to the next SENTENCE. If you
forgot the difference between statement and sentence, refer the first page.
It is advised to use END-IF, explicit scope terminator for the IF statements
than period, implicit scope terminator.
CLASS test is used to check the content of data item against pre-defined range of
values. It can be done as follows -
IF identifier is NUMERIC/ALPHABETIC/ALPHABETIC-HIGHER/
ALPHABETIC-LOWER
You can define your own classes in the special names paragraph. We have defined a
class DIGIT in our special names paragraph. It can be used in the following way.
IF identifier is DIGIT
Mainframe Refresher Part-1 COBOL-Page: 12
Negated conditions.
Any simple, relational, class, sign test can be negated using NOT.
But it is not always true that NOT NEGATIVE is equal to POSITIVE. (Example ZERO)
EVALUATE
With COBOL85, we use the EVALUATE verb to implement the case structure
of other languages. Multiple IF statements can be efficiently and effectively replaced
with EVALUATE statement. After the execution of one of the when clauses, the
control is automatically come to the next statement after the END-EVALUATE. Any
complex condition can be given in the WHEN clause. Break statement is not needed,
as it is so in other languages.
General Syntax
EVALUATE subject-1 (ALSO subject2..)
WHEN object-1 (ALSO object2..)
WHEN object-3 (ALSO object4..)
WHEN OTHER imperative statement
END--EVALUATE
1.Number of Subjects in EVALUATE clause should be equal to number of
objects in every WHEN clause.
2.Subject can be variable, expression or the keyword TRUE/ FLASE and
respectively objects can be values, TRUE/FALSE or any condition.
3.If none of the WHEN condition is satisfied, then WHEN OTHER path will be
executed.
Sample
EVALUATE SQLCODE ALSO TRUE
WHEN 100 ALSO A=B imperative statement
WHEN -305 ALSO (A/C=4) imperative statement
WHEN OTHER imperative statement
END-EVALUATE
Mainframe Refresher Part-1 COBOL-Page: 13
PERFORM STATEMENTS
PERFORM will be useful when you want to execute a set of statements in
multiple places of the program. Write all the statements in one paragraph and invoke
it using PERFORM wherever needed. Once the paragraph is executed, the control
comes back to next statement following the PERFORM.
1.SIMPLE PERFORM.
PERFORM PARA-1.
DISPLAY ‘PARA-1 executed’
STOP RUN.
PARA-1.
Statement1
Statement2.
It executes all the instructions coded in PARA-1 and then transfers the control
to the next instruction in sequence.
2.INLINE PERFORM.
When sets of statements are used only in one place then we can group all of
them within PERFORM END-PERFORM structure. This is called INLINE PERFORM.
This is equal to DO..END structure of other languages.
PERFORM
ADD A TO B
MULTIPLE B BY C
DISPLAY ‘VALUE OF A+B*C ‘ C
END-PERFORM
With TEST BEFORE, Condition is checked first and if it found false, then PARA-
1 is executed and this is the default. (Functions like DO- WHILE)
With TEST AFTER, PARA-1 is executed once and then the condition is
checked. (Functions like DO-UNTIL)
GO TO Usage:
In a structured top-down programming GO TO is not preferable. It offers
permanent control transfer to another paragraph and the chances of logic errors is
much greater with GO TO than PERFORM. The readability of the program will also be
badly affected.
But still GO TO can be used within the paragraphs being performed. i.e. When
using the THRU option of PERFORM statement, branches or GO TO statements, are
permitted as long as they are within the range of named paragraphs.
PERFORM 100-STEP1 THRU STEP-4
..
100-STEP-1.
ADD A TO B GIVING C.
IF D = ZERO
DISPLAY ‘MULTIPLICATION NOT DONE’
GO TO 300-STEP3
END-IF.
200-STEP-2.
MULTIPLY C BY D.
300-STEP-3.
DISPLAY ‘VALUE OF C:’ C.
Here GO TO used within the range of PERFORM. This kind of Controlled GO TO is fine
with structured programming also!
Mainframe Refresher Part-1 COBOL-Page: 15
TABLES
An OCCURS clause is used to indicate the repeated occurrences of items of
the same format in a structure. OCCURS clause is not valid for 01, 77, 88 levels.
It can be defined as elementary or group item. Initialization of large table
occurrences with specific values are usually done using perform loops in procedure
division. Simple tables can be initialized in the following way.
01 WEEK-ARRAY VALUE ‘MONTUEWEDTHUFRISATSUN’.
05 WS-WEEK-DAYS OCCURS 7 TIMES PIC X(03).
Dynamic array is the array whose size is decided during runtime just before the
access of first element of the array.
01 WS-MONTH-DAY-CAL.
05 WS-DAYS OCCURS 31 TIMES DEPENDING ON WS-OCCURENCE.
Array Items can be accessed using INDEX or subscript and the difference
between them are listed in the table. Relative subscripts and relative indexes are
supported only in COBOL85. Literals used in relative subscripting/indexing must be
an unsigned integer.
ADD WS-SAL(SUB) WS-SAL(SUB + 1) TO WS-SAL(SUB + 2).
Sl # Subscript Index
1 Working Storage item Internal Item – No need to declare it.
2 It means occurrence It means displacement
3 Occurrence, in turn translated to Faster and efficient.
displacement to access elements
and so slower than INDEX access.
4 It can be used in any arithmetic It cannot be used for arithmetic
operations or for display. operation or for display purpose.
5 Subscripts can be modified by any INDEX can only be modified with SET,
arithmetic statement. SEARCH and PERFORM statements.
Sometimes, you may face a question like how to randomly access the
information in the sequential file of 50 records that contains all the designation and
the respective lower and higher salary information.
Obviously, OS does not allow you to randomly access the sequence file. You
have to do by yourself and the best way is, load the file into a working storage table
in the first section of the program and then access as you wish.
Sequential SEARCH
During SERIAL SEARCH, the first entry of the table is searched. If the
condition is met, the table look-up is completed. If the condition is not met, then
index or subscript is incremented by one and the next entry is searched and the
process continues until a match is found or the table has been completely searched.
SET indexname-1 TO 1.
SEARCH identifier-1 AT END display ‘match not found:’
WHEN condition-1 imperative statement-1 /NEXT SENTENCE
WHEN condition-2 imperative statement-2 /NEXT SENTENCE
END-SEARCH
Identifier-1 should be OCCURS item and not 01 item.
Condition-1, Condition-2 compares an input field or search argument with a table
argument.
Though AT END Clause is optional, it is highly recommended to code that. Because if
it is not coded and element looking for is not found, then the control simply comes to
the next statement after SEARCH where an invalid table item can be referred and
that may lead to incorrect results / abnormal ends.
Binary SEARCH
When the size of the table is large and it is arranged in some sequence –
either ascending or descending on search field, then BINARY SEARCH would be the
efficient method.
4 Multiple WHEN conditions can be Only one WHEN condition can be coded.
coded.
5. Any logical comparison is possible. Only = is possible. Only AND is possible
in compound conditions.
6 Index should be set to 1 before Index need not be set to 1 before
using SEARCH SEARCH ALL.
7 Prefer when the table size is small Prefer when the table size is significantly
large.
If you want access any working storage variable of PGMA in PGMB, then
declare them with the clause ‘IS GLOBAL’ in PGMA. If you want to access any
working storage variable of PGMB in PGMA, declare them with the clause ‘IS
EXTERNAL’ in PGMB. Nested Programs are supported only in COBOL85.
If there is a program PGMC inside PGMB, it cannot be called from PGMA
unless it’s program id is qualified with keyword COMMON.
Syntax:
SORT SORTFILE ON ASCENDING /DESCENDING KEY sd-key-1 sd-key2
USING file1 file2 / INPUT PROCEDURE IS section-1
GIVING file3 / OUTPUT PROCEDURE is section-2
END-SORT
File1, File2 are to-be-sorted input files and File3 is sorted-output file and all
of them are defined in FD.SORTFILE is Disk SORT Work file that is defined at SD. It
should not be explicitly opened or closed.
INPUT PROCEDURE and USING are mutually exclusive. If USING is used, then
file1 and files should not be opened or READ explicitly. If INPUT PROCEDURE is used
then File1 and file2 need to be OPENed and READ the records one by one until end of
the file and pass the required records to sort-work-file using the command RELEASE.
Syntax: RELEASE sort-work-record from input-file-record.
OUTPUT Procedure and GIVING are mutually exclusive. If GIVING is used,
then file3 should not be opened or WRITE explicitly. If OUTPUT procedure is used,
then File3 should be OPENed and the required records from sort work file should be
RETURNed to it. Once AT END is reached for sort-work-file, close the output file.
Syntax: RETURN sort-work-file-name AT END imperative statement.
Example:
WS-NAME – ‘MUTHU SARAVANA SURYA CHANDRA DEVI’
STRING
STRING command is used to concatenate one or more strings.
Syntax:
STRING identifier-1 / literal-1, identifier-2/ literal-2
DELIMITED BY (identifier-3/literal-3/SIZE)
INTO identifier-4
END-STRING.
Syntax: String(Starting-Position:Length)
MOVE ‘18’ TO AGE-OUT(1:2) does the same as what we did with STRING command.
When it is used in array elements, the syntax is
Array-element (occurrence) (Starting-Position:Length)
UNSTRING
UNSTRING command is used to split one string to many strings.
Syntax:
UNSTRING identifier-1
[DELIMITED BY (ALL/) identifier2/literal1 [,OR (ALL/) (identifier-3/literal-2),..]]
INTO identifier-4 [,DELIMITER IN identifier-5, COUNT IN identifier-6]
[,identifier-7 [,DELIMITER IN identifier-8, COUNT IN identifier-9]
Mainframe Refresher Part-1 COBOL-Page: 21
1.Common routines like error routine, date validation routine are coded in a library
and bring into the program by COPY.
2. Master files are used in multiple programs. Their layout can be placed in one
copybook and be placed wherever the files are used. It promotes program
standardization since all the programs share the same layout and the same data
names.
This reduces coding and debugging time. Change in layout needs change in
copybook only. It is enough if we just recompile the program for making the new
copy effective.
Syntax:
COPY copybook-name [(OF/IN) library name]
[REPLACING string-to-be-replaced BY replacing-string]
Copybooks are stored as members in PDS library and during compilation time, they
are included into the program. By default, the copybook library is SYSLIB and it can
be changed using IN or OF of COPY statement.
If the same copybook is used more than once in the program, then there will
be “duplicate data declaration” error during compilation, as all the fields are declared
twice. In this case, one copybook can be used with REPLACING verb to replace high-
level qualifier of the all the variables with another qualifier.
Programs can be written in any programming language. They are typically written in
a language best suited to the specific task required and thus provide greater
flexibility.
Sub-Program Changes:
WS-VAR1 and WS-VAR2 are working storage items of main program.
As we have already mentioned, the linkage section is used for accessing external
elements. As these working storage items are owned by main program, to access
them in the sub-program, we need to define them in the linkage section.
LINKAGE SECTION.
01 LINKAGE SECTION.
05 LK-VAR1 PIC 9(04).
05 LK-VAR2 PIC 9(04).
In addition to define them in linkage section, the procedure division should be coded
with these data items for address-ability.
If the sub program is modified then it needs to be recompiled. The need for
main program recompilation is decided by the compiler option used for the main
program. If the DYNAM compiler is used, then there is no need to recompile the main
program. The modified subroutine will be in effect during the run. NODYNAM is
default that expects the main program recompilation.
Mainframe Refresher Part-1 COBOL-Page: 23
INTRINSIC FUNCTIONS:
LENGTH Returns the length of the PIC clause. Used for finding length of group
item that spanned across multiple levels.
MAX Returns the content of the argument that contains the maximum value
MIN Returns the content of the argument that contains the minimum value
NUMVAL Returns the numeric value represented by an alphanumeric character
string specified in the argument.
NUMVAL-C Same as NUMVAL but currency and decimal points are ignored during
conversion.
CURRENT Returns 21 Chars alphanumeric value – YYYYMMDDHHMMSSnnnnnn
DATE
Mainframe Refresher Part-1 COBOL-Page: 24
FILE HANDLING
A data file is collection of relevant records and a record is collection of
relevant fields. The file handling in COBOL program involves five steps.
Steps in file-handing
2.Definition. The layout of the file and its attributes are defined in the FILE
SECTION of DATA DIVISION.
4.Process: Process the file as per requirement, using the I-O statements
provided by COBOL. (READ, WRITE, REWRITE and DELETE)
5. Close: After the processing, close the file to disconnect it from the
program.
JCL Step executing the program should have a dataset with DDNAME as label
//DDNAME DD DSN=BPMAIN.EMPLOYEE.DATA,DISP=SHR
SELECT Statement-ORGANIZATION
It can be SEQUENTIAL (PS or VSAM ESDS), INDEXED (VSAM KSDS),
RELATIVE (VSAM RRDS). Default is Sequential.
RANDOM.
Records can be randomly accessed in the program using the
primary/alternate key of indexed file organization or relative record number of
relative organization.100th record can directly be read after getting the address of the
record from the INDEX part for INDEXED files.100th record can directly be read for
RELATIVE files even without any index.
DYNAMIC.
It is mixed access mode where the file can be accessed in random as well as
sequential mode in the program.
Example: Reading the details of all the employees between 1000-2000. First
randomly access 1000th employee record, then read sequentially till 2000th employee
record. START and READ NEXT commands are used for this purpose in the procedure
division.
RESERVE Clause.
RESERVE clause [RESERVE integer AREA ] can be coded in the SELECT
statement. The number of buffers to be allocated for the file is coded here.
By default two buffers will be allocated if the clause is not coded. Since similar option
is available in JCL, this is not coded in program.
RESERVE 1 AREA allocates one buffer, for the file in the SELECT statement.
FD FILENAME
RECORDING MODE IS V/VB/F/FB
RECORD CONTAINS M CHARACTERS (TO N CHARACTERS)
BLOCK CONTAINS X CHARACTERS/RECORDS (TO Y CHARACTERS/RECORDS)
LABEL RECORDS ARE OMITTED/STANDARD
DATA RECORD IS FILE-RECORD.
01 FILE-RECORD PIC X(nnn).
FD-RECORD CONTAINS
It specifies the length of the record in terms of bytes. (It will be RECORD
contains m to n CHARACTERS for variable format files)
FD-BLOCK CONTAINS
It specifies the physical record size. It can be mentioned as number of logical
records OR number of characters, that is multiple of logical record length. It is
suggested to code BLOCK CONTAINS 0 RECORDS so that system will decide the
optimum size for the file based on the device used for storing the file. BLOCK
CONTAINS clause is treated as comments for VSAM files.
Advantage of Blocking:
1.I-O time is reduced as n numbers of records are read into main memory buffer
during an I-O.
2.Inter record gap is removed and the gap exist only between blocks. So memory
wastage due to IRG is avoided.
FD-RECORDING MODE IS
It can be F (FIXED) V(VARIABLE) FB(FIXED BLOCK) VB(VARIABLE BLOCKED)
Variable record file identification:
If there is no recording mode/record contains clause, it is still possible to
identify variable length records. If there is an OCCURS depending on clause or there
are multiple 01 levels and every 01 level is of different size, then the file would be of
variable length. Multiple 01 level in File section is an example for implicit redefinition.
Mainframe Refresher Part-1 COBOL-Page: 27
OPEN STATEMENT
Syntax: OPEN OPENMODE FILENAME
OPENMODE can be INPUT OUTPUT I-O EXTEND
INPUT - File can be used ONLY-FOR-READ purpose.
OUTPUT - File can be used ONLY-FOR-WRITE purpose.
I-O - File can be used FOR READ, WRITE and REWRITE purpose.
EXTEND - File can be used FOR appending records using WRITE.
CLOSE statement.
The used files are closed using CLOSE statement. If you don’t close the files,
the completion of the program closes all the files used in the program.
Syntax: CLOSE FILENAME
When you close the file, the tape is normally rewound. The NO REWIND
clause specifies that the TAPE should be left in its current position.
CLOSE statement with REEL option closes the current reel alone. So the next
READ will get the first record of next REEL. This will be useful when you want skip all
the records in the first reel after n number of records processing.
Since TAPE is sequential device, if you create multiple files in the same TAPE,
then before opening the second file, first file should be closed. At any point of time,
you can have only one file is active in the program. In addition to this, you have to
code MULTIPLE FILE clause in the I-O control paragraph of environment division.
MULTIPLE FILE TAPE CONTAINS OUT-FILE1 POSITION 1
OUT-FILE3 POSITION 3.
Mainframe Refresher Part-1 COBOL-Page: 28
The files OUT-FILE1 and OUT-FILE3 used in the program are part of a same
TAPE and they exist in first and third position in the tape. Alternatively, this
information can be passed from JCL using LABEL parameter.
READ statement
READ statement is used to read the record from the file.
Syntax: READ FILENAME [INTO ws-record] [KEY IS FILE-KEY1]
[AT END/INVALID KEY imperative statement1]
[NOT AT END/NOT INVALID KEY imperative statement2]
END-READ
If INTO clause is coded, then the file is directly read into working storage
section record. It is preferred as it avoids another move of file-section-record to
working-storage-record followed by simple READ. READ-INTO is not preferred for
variable size records where the length of the record being read is not known.
KEY IS clause is used while accessing a record randomly using
primary/alternate record key.
AT END and NOT AT END are used during sequential READ of the file.
INVALID KEY and NOT INVALID KEY are used during random read of the file.
Before accessing the file randomly, the key field should have a value before READ.
WRITE Statement
Write statement is used to write a new record in the file. If the file is opened
in EXTEND mode, the record will be appended. If the file is opened in OUTPUT mode,
the record will be added at the current position.
FROM clause avoids the explicit move of working storage record to file section record
before WRITE.
REWRITE Statement
REWRITE is used to update an already read record. To update a record in a
file, the file should be opened in I-O mode.
Syntax: REWRITE FILE-RECORD [FROM ws-record]
[INVALID KEY imperative statement1]
END-REWRITE
Mainframe Refresher Part-1 COBOL-Page: 29
START Statement
START is used with dynamic access mode of indexed files. It establishes the
current location in the cluster for READ NEXT statement. START itself does not
retrieve any record.
Syntax: START FILENAME
KEY is EQUAL TO/NOT LESS THAN/GREATER THAN key-name
[INVALID KEY imperative statement1]
END-START.
DELETE Statement
DELETE is used to delete the most recently read record in the file. To delete a
record, the file should be opened in I-O mode.
Syntax: DELETE FILENAME RECORD
[INVALID KEY imperative statement1]
END-DELETE
PROCEDURE DIVISION.
DECLARATIVES.
USE-PROCEDURE SECTION.
USE AFTER EXCEPTION PROCEDURE ON INPUT
ERROR-PROCEDURE.
Check the file-status code for validity.
Mainframe Refresher Part-1 COBOL-Page: 30
END-DECLARATIVES.
Whenever there is an error in the processing of ANY FILE opened in INPUT
mode, then the control comes to ERROR-PROCEDURE. The validity of error should be
checked in this paragraph and allow or restrict the process down, based on severity
of error code.
If SAME RECORD AREA is coded, then the buffer is not shared but only the
record area is shared. So more than one file can be in open state. We should be
careful while filling in the record area of the output file. This may destroy the record
read most recently.
Syntax: SAME RECORD AREA FOR file-1 file-2 file-3.
SAME SORT AREA allows more than one sort/merge work files to use the
same area. The sort work files are automatically allocated when file is opened and
de-allocated when file is closed. As the sort file is automatically opened and closed
during a SORT and two sort files cannot be opened at a time, this clause may not be
useful.
Syntax: SAME SORT|SORT-MERGE AREA for file-1 file-2.
File-1 or file-2 should be a SD file.
ENTRY statement
ENTRY statement establishes an alternate ENTRY point in a COBOL called
sub-program. When a CALL statement naming the alternate entry point is executed
in a calling program, control is transferred to the next executable statement
Mainframe Refresher Part-1 COBOL-Page: 31
following the entry statement. Except when a CALL statement refers to an entry
name, the ENTRY statements are ignored at run-time.
Matching Logic
If you have been given two files of similar type, say master and transaction
file and you are requested to update the master file with transaction file information
for existing records and prepare a report of new transactions and deleted
transactions, then you should go for what is called Matching logic. This is also known
as co-sequential processing.
Sort both the files on key and compare the keys. If the keys are matching
then update the file. If you find any record that is found in transaction but not in
master file, then that is new addition and the reverse is deletion. If the master key is
greater than transaction key, then that corresponds to the first case and reverse is
the second case.
This can be easily done in JCL using ICETOOL. Refer JCL section.
It is a two-byte working storage item. The first byte denotes the general
category whereas second byte denotes the particular type of error message under
that category.
COBOL COMPILATION
SYSPRINT
PARM (Compiler listing)
(Compiler
Options)
SYSLIB PARM
(Copybook Library) (Link
edit Options)
IEWL
(Link Editor)
SYSLMOD
(Load Module)
SYSPRINT SYSLIB
(Link edit messages) (Subroutine Library)
COMPILATION JCL:
//SMSXL86B JOB ,'COMPILATION JCL', MSGCLASS=Q,MSGLEVEL=(1,1),CLASS=C
//COMPILE1 EXEC PGM=IGYCRCTL, PARM=’XREF,APO,ADV,MAP,LIST),REGION=0M
//STEPLIB DD DSN=SYS1.COB2LIB,DISP=SHR
//SYSIN DD DSN=SMSXL86.TEST.COBOL(SAMPGM01),DISP=SHR
//SYSLIB DD DSN=SMSXL86.COPYLIB,DISP=SHR
//SYSPRINT DD SYSOUT=*
Mainframe Refresher Part-1 COBOL-Page: 33
Compiler Options
The default options that were set up when your compiler was installed are in
effect for your program unless you override them with other options. To check the
default compiler options of your installation, do a compile and check in the
compilation listing.
ADV: It is meaningful if your program has any printer files with WRITE..ADVANCING
keyword. The compiler adds one byte prefix to the original LRECL of printer files for
printing control purpose. If you are manually populating printing control character in
the program, then you can compile your program with NOADV.
DYNAM: Use DYNAM to cause separately compiled programs invoked through the
CALL literal statement to be loaded dynamically at run time. DYNAM causes dynamic
loads (for CALL) and deletes (for CANCEL) of separately compiled programs at object
time. Any CALL identifier statements that cannot be resolved in your program are
also treated as dynamic calls. When you specify DYNAM, RESIDENT is also put into
effect.
LIST/OFFSET: LIST and OFFSET are mutually exclusive. If you use both, LIST will be
ignored. LIST is used to produce listing a listing of the assembler language expansion
of your code. OFFSET is used to produce a condensed Procedure Division listing.
With OFFSET, the procedure portion of the listing will contain line numbers,
statement references, and the location of the first instruction generated for each
statement. These options are useful for solving system ABENDS. Refer JCL session
for more details.
MAP: Use MAP to produce a listing of the items you defined in the Data Division.
SSRANGE: If the program is compiled with SSRANGE option, then any attempt to
refer an area outside the region of the table will abnormally terminate with
protection exception, usually S0C4.It also avoids any meaningless operation on
reference modification like negative number in the starting position of reference
modification expression. If the program is compiled with NOSSRANGE, then the
program may proceed further with junk or irrelevant data. So usually the programs
are compiled with SSRANGE during development and testing.
RESIDENT: Use the RESIDENT option to request the COBOL Library Management
Feature. (The COBOL Library Management Feature causes most COBOL library
routines to be located dynamically at run time, instead of being link-edited with the
COBOL program.).CICS Programs should be compiled with RESIENT option.
XREF: Use XREF to get a sorted cross-reference listing. EBCDIC data-names and
procedure-names will be listed in alphanumeric order. It also includes listing, where
all the data-names that are referenced within your program and the line number
where they are defined. This is useful for identifying the fields that are defined but
not used anywhere after the development of new program.
Mainframe Refresher Part-1 COBOL-Page: 35
Data Division.
Working-Storage Section.
01 Filler.
05 ws-dummy Pic s9(8) Comp.
05 ws-return-code Pic s9(8) Comp.
05 ws-reason-code Pic s9(8) Comp.
05 ws-info-code Pic s9(8) Comp.
05 ws-cppl-address Pic s9(8) Comp.
05 ws-flags Pic X(4) Value X'00010001'.
05 ws-buffer Pic X(256).
05 ws-length Pic s9(8) Comp Value 256.
Procedure Division.
*----------------------------------------------------------------*
* Call IKJTSOEV to create the TSO/E environment *
*----------------------------------------------------------------*
CALL 'IKJTSOEV' Using ws-dummy,ws-return-code,ws-reason-code,
ws-info-code,ws-cppl-address.
IF ws-return-code > zero
DISPLAY 'IKJTSOEV Failed, Return-code=' ws-return-code
' Reason-code=' ws-reason-code
'Info-code=' ws-info-code
MOVE ws-return-code to Return-code
STOP RUN.
*----------------------------------------------------------------*
* Build the TSO/E command in ws-buffer *
*----------------------------------------------------------------*
*----------------------------------------------------------------*
* Call the TSO/E Service Routine to execute the TSO/E command *
*----------------------------------------------------------------*
CALL 'IKJEFTSR' Using ws-flags,ws-buffer,ws-length
ws-return-code,ws-reason-code,ws-dummy.
IF ws-return-code > zero
DISPLAY 'IKJEFTSR Failed, Return-code=' ws-return-code
' Reason-code=' ws-reason-code
MOVE ws-return-code to Return-code
STOP RUN.
*----------------------------------------------------------------*
* Check that the ALLOCATE command worked *
*----------------------------------------------------------------*
DISPLAY 'ALLOCATE Worked ! ' Upon Syspunch.
STOP RUN.
Interview Questions(IQ):
28.To use SEARCH ALL, the table should be in sorted order. I am loading the table
from one of the PDS members. The PDS member data is not in sorted order. How will
I load the table in SORTED order? You should not sort in JCL. **
29.What is the purpose of USE statement? *
30.What are SAME AREA and SAME RECORD AREA? *
31. Is dynamic allocation possible in COBOL? If yes, How? *
32. What is the difference between ON SIZE ERROR and ON OVERFLOW? *
33.How to swap two variables without third variable? *
34.What is limit of linkage section? *
What is the limit of working storage and linkage section limit? (IQ 34)
Working storage and Linkage section limit of COBOL85 is 128MB (COBOL74-
1MB)
77,01-49 level item limit in COBOL85 is 16MB (COBOL74-1MB)
How to swap the values of two variables without an intermediate variable?(IQ 33)
Let the variables be A and B
Way 1: COMPUTE A = A+B Way 2: COMPUTE A=A*B
COMPUTE B = A-B COMPUTE B=A/B
COMPUTE A = A-B COMPUTE A=A/B
I have retrieved a value from DB2 VARCHAR column. (Ex: WS-VAR = ‘muthu$sara$‘
$ is 1-n spaces.) How to get the length of the WS-VAR in COBOL program? I should
not count right hand spaces. (IQ 20)
LENGTH function counts space also as a character. So we cannot use that
function for our purpose. INSPECT is also not useful as the string may contain 1- n
spaces in between and that needs to be counted. So the logic would be ” Read from
right until you read first noon-space character”.
PERFORM VARYING WS-SUB-NAME FROM
LENGTH OF WS-VAR BY -1
UNTIL END-FOUND OR WS-SUB-NAME = 0
IF WS-NAME-CHK(WS-SUB-NAME:1) NOT EQUAL TO SPACE
MOVE 'Y' TO WS-END-OF-FIELD
DISPLAY 'LENGTH ' WS-SUB-NAME
END-IF
END-PERFORM
How to pass user return code and user ABEND from the COBOL program to the JCL?
RETURN-CODE is a special register and its content is moved to register15 when the
control is given back to OS. So move the return code to this register in the program.
Mainframe Refresher Part-1 COBOL-Page: 38
Bubble Sort: Consecutive elements are compared and keys of two elements are not
in proper order, they are swapped. In the first pass, the key with largest value will
be moved to the last position and n-1 passes needed to sort the whole table.
In between, if any pass results no interchange it implies that the table is in sorted
order.
Array: 1 20 9 50 8
First Pass: (Maximum 4 comparisons for 5 elements)
1, 20->no change, 20 & 9 -> 20 is great so swap (1 9 20 50),
20 & 50 -> no change, 50 & 8 -> 50 is great, so swap. (1 9 20 8 50)
Second Pass: (1 9 20 8 50) - (Maximum 3 comparison for 5 elements)
1 & 9-> no change, 9 & 20 -> no change, 20 & 8 -> 20 is great so swap
(1 9 8 20 50)
Third Pass: (1 9 8 20 50) – (Maximum 2 comparisons for 5 elements)
1 & 9 -> no change, 9 & 8-> change (1 8 9 20 50)
Fourth Pass: (1 8 9 20 50) – (Maximum 1 comparison for 5 elements)
1 & 9 -> no change
Note: You can come out of sort when you find ‘no change’ in all the
comparisons of a pass.
Shuttle Sort: In the first pass only first two elements are compared and sorted and
in the second pass, third element is compared with two and one and it is placed in
the right position. In the ith pass, it assumes that I elements are in already sorted
order, proceeds to sort the first (I+1) elements by comparing I+1 th element with I,
and I with I-1 and so on until top of the table is reached or no-exchange in a
comparison.
Array: 1 20 9 50 8
First Pass: Two elements (1 20) - Maximum 1 comparison
1, 20->no change
Mainframe Refresher Part-1 COBOL-Page: 39
Shuttle sort is better than bubble sort for sorting arrays with more than 10 elements.
COMP-3 items are always better than COMP with respect to memory usage (IQ 21)?
No. COMP items occupy less space than COMP-3 items at boundaries.
PIC S9(04) COMP occupies 2 bytes whereas PIC S9(04) COMP-3 occupies 3 bytes.
PIC S9(09) COMP occupies 4 bytes whereas PIC S9(09) COMP-3 occupies 5 bytes.
PIC S9(18) COMP occupies 8 bytes whereas PIC S9(18) COMP-3 occupies 10 bytes.
I have a KSDS Students file with 4 bytes key. First two-bytes contain class number
and next two-bytes contain student number. I want to read all the students in class
‘02’. How will you do that?
Allocate the file with dynamic access mode. Move ‘02’ to first two-bytes of the
key and low-values to next two-bytes of the key. You can do these moves by
reference modification operator or de-grouping the four-byte field into two two-byte
fields in the file section.
Issue the START command with KEY IS GREATER THAN clause. Start reading
the file in loop until first two-bytes is not equal to 2.
NOTES
Mainframe Refresher Part-1 COBOL-Page: 40
NOTES
Mainframe Refresher Part-1 COBOL-Page: 41