home *** CD-ROM | disk | FTP | other *** search
/ Power-Programmierung / CD1.mdf / cobol / library / assist / assist.cbl < prev    next >
Text File  |  1993-12-08  |  1KB  |  25 lines

  1. 000010$set ans85 mf noosvs
  2. 000020
  3. 000100 IDENTIFICATION DIVISION.
  4. 000200 PROGRAM-ID. ASSIST.
  5. 000210*************************** ASSIST.CBL *******************************
  6. 000211**              Copyright 1993 George F. Harris
  7. 000212**
  8. 000220**  This program is the Main Menu of a Help program for Micro Focus
  9. 000230**  COBOL.  It chains to a menu of choices which then chains to the
  10. 000240**  appropriate program.
  11. 000250**
  12. 000260**  The program itself does not do anything but begin the program.  As
  13. 000270**  Chaining always maintians the first program in memory, this short
  14. 000271**  first program is used to insure that as little memory is locked up
  15. 000272**  as is possible.
  16. 000280***********************************************************************
  17. 000300 ENVIRONMENT DIVISION.
  18. 000400 DATA DIVISION.
  19. 000500 WORKING-STORAGE SECTION.
  20. 000600 01 CHAIN-SWITCH              PIC X VALUE SPACES.
  21. 000700 PROCEDURE DIVISION.
  22. 000800 000-MAIN.
  23. 001100     CHAIN "ABEND2.EXE"
  24. 001200     END-CHAIN.
  25.