Skip to content

Commit d660d52

Browse files
committed
renamed cbl, jcl files and updated .md
Signed-off-by: Athar Ramzan <atharramzan.ofi@gmail.com>
1 parent 4ceadd2 commit d660d52

File tree

3 files changed

+8
-8
lines changed

3 files changed

+8
-8
lines changed

COBOL Programming Course #2 - Learning COBOL/COBOL Programming Course #2 - Learning COBOL.md

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -3613,13 +3613,13 @@ In COBOL, a division by zero will not result in a warning, it will immediately c
36133613
`*
36143614

36153615
### Instructions
3616-
1. Open the file `CBL0067.cbl`. Look at the line where division occurs:
3616+
1. Open the file `CBL0013.cobol`. Look at the line where division occurs:
36173617

36183618
![](Images/image0068.png)
36193619

3620-
2. In `CBL0067.cbl`, notice that DENOMINATOR is initialized to 0, causing a division-by-zero.
3620+
2. In `CBL0013.cobol`, notice that DENOMINATOR is initialized to 0, causing a division-by-zero.
36213621

3622-
3. Submit the JCL program: `CBL0067J.jcl`.
3622+
3. Submit the JCL program: `CBL0013J.jcl`.
36233623

36243624
*You should observe the job fails with a S0CB ABEND.*
36253625

COBOL Programming Course #2 - Learning COBOL/Labs/cbl/CBL0067.cobol renamed to COBOL Programming Course #2 - Learning COBOL/Labs/cbl/CBL0013.cobol

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
IDENTIFICATION DIVISION.
2-
PROGRAM-ID. CBL0067.
2+
PROGRAM-ID. CBL0013.
33
AUTHOR. Athar Ramzan.
44
55
DATA DIVISION.

COBOL Programming Course #2 - Learning COBOL/Labs/jcl/CBL0067J.jcl renamed to COBOL Programming Course #2 - Learning COBOL/Labs/jcl/CBL0013J.jcl

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -1,12 +1,12 @@
1-
//CBL0067J JOB 1,NOTIFY=&SYSUID
1+
//CBL0013J JOB 1,NOTIFY=&SYSUID
22
//***************************************************/
33
//COBRUN EXEC IGYWCL
4-
//COBOL.SYSIN DD DSN=&SYSUID..CBL(CBL0067),DISP=SHR
5-
//LKED.SYSLMOD DD DSN=&SYSUID..LOAD(CBL0067),DISP=SHR
4+
//COBOL.SYSIN DD DSN=&SYSUID..CBL(CBL0013),DISP=SHR
5+
//LKED.SYSLMOD DD DSN=&SYSUID..LOAD(CBL0013),DISP=SHR
66
//***************************************************/
77
// IF RC = 0 THEN
88
//***************************************************/
9-
//RUN EXEC PGM=CBL0067
9+
//RUN EXEC PGM=CBL0013
1010
//STEPLIB DD DSN=&SYSUID..LOAD,DISP=SHR
1111
//SYSOUT DD SYSOUT=*,OUTLIM=15000
1212
//CEEDUMP DD SYSOUT=*

0 commit comments

Comments
 (0)