Skip to content
Snippets Groups Projects
infloop.cbl 517 B
Newer Older
       ID DIVISION.
       PROGRAM-ID. infloop.
       DATA DIVISION.
       WORKING-STORAGE SECTION.
        77 counter PIC 9(9)      VALUE ZERO.
        77 state_of_hell PIC 9   VALUE 0.
            88 hell-freezes-over VALUE 1.
       PROCEDURE DIVISION.
       PERFORM UNTIL hell-freezes-over
      *> Just runs forever.  This is a target for testing
      *> the ability to attach to a running process
            DISPLAY counter
            ADD 1 to counter
            END-PERFORM.
       END PROGRAM infloop.