How to Execute CLIST Â When we start learning CLIST, we learn few commands and are quite excited to test them. Most of the training and tutorials would educate you the methods of executing your CLISTs, but it happens so that these methods do not work on your installation. The following tutorial will list down […]
Uncategorized
INSPECT REPLACING ALL SPACES BY LITERAL
INSPECT REPLACING ALL SPACES BY LITERAL The following COBOL program depicts the use of INSPECT REPLACING ALL SPACES BY LITERAL     01 TEST-STRING  PIC X(50) VALUE SPACES.     01 WS-COUNTER   PIC 9(9)  VALUE ZEROES.     01 SEARCH-STRING PIC X(2)  VALUE SPACES.       Â
INSPECT REPLACING ALL SPACES BY LITERAL Read More »
COBOL GO TO DEPENDING ON
The following COBOL program depicts the use of     01 PARA-NUM PIC 9 VALUE ZEROS.        DISPLAY ‘PARA NAME IS  10000-FIRST-PARA’        DISPLAY ‘PARA NAME IS  20000-FIRST-PARA’.        DISPLAY ‘PARA NAME IS  25000-SECOND-PARA’.      Â
COBOL GO TO DEPENDING ON Read More »
JCL TO CONVERT VB TO FB FILE
CONVERTING A FILE IN VB FORMAT TO FB FORMAT //SORTIN Â DD DSN=USERID.ABC.VBFORMAT,DISP=SHR Â Â //SORTOUT Â DD DSN=USERID.ABC.FBFORMAT, Â Â Â Â Â Â Â // Â Â Â Â Â Â DISP=(,CATLG,DELETE),UNIT=SYSDA, Â Â Â // Â Â Â Â Â Â DCB=(LRECL=80,RECFM=FB) Â Â Â Â Â Â Â Â Â OUTREC FIELDS(1:20,80),CONVERT Â Â Â Â Â
JCL TO CONVERT VB TO FB FILE Read More »
precompile compile and link edit jcl for cobol db2 program
Precompile compile and link edit jcl for cobol db2 program The following JCL can be used for compilng and link editing a COBOL DB2 program. This JCL has mainly three steps The PRE COMPILATION Step executes the utility DSNHPC and uses the COBOL DB2 program present in source library and copy library for DCLGEN’s  as input
precompile compile and link edit jcl for cobol db2 program Read More »
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 »
JCL to List Migrated Datasets
LIST MIGRATED DATASETS STARTING WITH A QUALIFIER //LSTMIGR Â JOB (XXXXXXX,,,,,XXXX),’ Â Â Â Â ‘, Â Â Â Â Â Â Â Â Â Â Â // Â Â Â Â Â Â CLASS=T,MSGCLASS=Y,NOTIFY=&SYSUID, Â Â Â Â Â Â Â Â Â Â //STEP000 Â EXEC PGM=IEFBR14 Â Â Â Â Â Â Â Â
JCL to List Migrated Datasets Read More »
Real life example of -805 sql code
Real life example of -805 sql code Can anyone tell me how would I get a -805 sql code, I read the description as the DBRM or package not found in PLAN? I have encountered sql code -818 which is due to timestamp inconsistency but have never personally faced sql code of -805. “; ;
Real life example of -805 sql code Read More »
Example of REDEFINE CLAUSE PROGRAM IDENTIFICATION DIVISION.                                        PROGRAM-ID. PGM002.                                             AUTHOR. MAINFRAMEWIZARD.                                        DATA DIVISION.                                                  WORKING-STORAGE SECTION.                                        01 DATE1 PIC X(8).                                              01 DATE2 REDEFINES DATE1.                                         05 DATE2-DD   PIC X(2).                                       05 DATE2-MM   PIC X(2).                                       05 DATE2-YYYY PIC X(4).                                     PROCEDURE DIVISION.                                             10000-MAIN-PARA.                                                     MOVE 08092010 TO DATE1                                  Â