Enable Debugging Lines Example


Scenario - Enabling debugging mode.

Code -

----+----1----+----2----+----3----+----4----+----5----+
       IDENTIFICATION DIVISION.
       PROGRAM-ID. ENADEBUG.
       AUTHOR. MTH.

       ENVIRONMENT DIVISION.
       CONFIGURATION SECTION.
       SOURCE-COMPUTER. IBM3278 WITH DEBUGGING MODE.
	   OBJECT-COMPUTER. IBM3278.

       PROCEDURE DIVISION.
 
      D    DISPLAY "DEBUGGING LINE".
           DISPLAY "NORMAL LINE".
           STOP RUN.

Output -

DEBUGGING LINE 
NORMAL LINE    

Explaining Example -

In the above example:

  • WITH DEBUGGING MODE - enables all the debugging lines (coded with 'D' in the 7th column), and the compiler considers them as part of the code by the compiler. So, "DEBUGGING LINE" is displayed in the output.