COBOL

COBOL PERFORM UNTIL

The following COBOL program depicts the use of         01 WS-SUB   PIC 9 VALUE ZEROS.              PERFORM 20000-FIRST-PARA UNTIL WS-SUB=5              DISPLAY ‘PARA NAME IS  10000-FIRST-PARA’              DISPLAY ‘PARA NAME IS  20000-FIRST-PARA’. The ouput of the above […]

COBOL PERFORM UNTIL Read More »

More COBOL Interview Questions

Which of the following is not a procedure division verb?   A)    Read B)    InsertC)    Delete D)    Start   Which of the following is false about the formal parameters in a subroutine? A)    Every formal parameter must appear in the linkage section of the subroutineB)    Every formal parameter must appear in the using phrase of

More COBOL Interview Questions Read More »

COBOL EVALUATE LITERAL

The following COBOL program depicts the use of         01 STUDENT1-MARKS   PIC 999  VALUE ZEROS.        01 STUDENT2-MARKS   PIC 999  VALUE ZEROS.              MOVE 99   TO STUDENT1-MARKS.              MOVE 100  TO STUDENT2-MARKS.             

COBOL EVALUATE LITERAL Read More »

Free COBOL compilers

Free COBOL compilers The following is a list of free COBOL compilers available in the market. Tiny COBOL Free Compiler Tiny COBOL is an Open source free COBOL compiler. This free COBOL compiler implements the standards of COBOL 85. Tiny COBOL compiler is portable and works well on different platforms and operating systems like FreeBSD,

Free COBOL compilers Read More »