Please give me the coding for converting VB to FB and FB to VB
Answers were Sorted based on User's Feedback
Answer / sr
//STEP1 EXEC PGM=SORT
//SYSOUT DD SYSOUT=*
//SORTIN DD DSN=SDS.OUTPUT.FBVB,DISP=SHR
//OUT1 DD DSN=SDS.OUTPUT.VBFB,
// DISP=(NEW,CATLG,DELETE),UNIT=SYSDA,
// SPACE=(TRK,(5,5)),
// DCB=(RECFM=FB,LRECL=80)
//SYSIN DD *
OPTION COPY
OUTFILE FNAMES=OUT1,VTOF,OUTREC=(5,80)
/*
SDS.OUTPUT.FBVB is a VB file of Record length=
84
Is This Answer Correct ? | 4 Yes | 1 No |
Answer / allu prakash
//STEP1 EXEC PGM=SORT
//SYSOUT DD SYSOUT=*
//SORTIN DD DSN=SAS12D.G4662V00.TEST,DISP=SHR
//SORTOUT DD DSN=GGJ67D.TEST4,
// DISP=(NEW,CATLG,DELETE),
// SPACE=(TRK,(10,10),RLSE),
// RECFM=FB,LRECL=10,DSORG=PS
//SYSIN DD *
OPTION VLSHRT
SORT FIELDS=COPY
INCLUDE COND=(89,1,CH,EQ,C'Y',AND,5,3,ZD,EQ,120)
OUTREC FIELDS=(8,2,PD,EDIT=(TTTTTTTTTT))
i hope this is the right to convert the VB TO FB..let me
know if the given answer is wrong......
Is This Answer Correct ? | 3 Yes | 4 No |
Answer / harsha
Important point is VB file will have 4 bytes extra than
it's corresponding FB file.
The four bytes contain catalog information of the file.
Is This Answer Correct ? | 2 Yes | 4 No |
What all are the changes to be made in JCL so as to do testing?
What is Backward Referencing ?
How can values be passed from the job stream to an executable program?
01 GROUP-ITEM 05 AMOUNT-1 PIC 99V9 USAGE COMP VALUE 50 05 AMOUNT-2 PIC 9(4)V99 USAGE COMP MOVE ZERO TO GROUP-ITEM ADD 50 TO AMOUNT-1 what will be the content of AMOUNT-1? a.50 b.100 c.0 d.unpredictable
can any one plzzzzzz tell the jcl code for creating ps using idcams
Hi, can we call catalog( say myproc } proc n times in jcl if so how please explain Thanks in advance
Explain about Specifying compiler options in the PROCESS (CBL) statement
IN DFSORT sum fields=none is usec to remove duplicates.how to write the duplicates in another dataset?
What is a Dummy Utility and what it does ?
What is COND=ONLY ?
My Question is 1. How to cound no. of records in JCL. Please explain with an example. 2. How to execute only odd steps in JCL? I know EDIT TYPE = Inculde, Step Name = 1,3,5 and COND code for all even step. Anyone knows other than this.
how do u send return code from cobol to jcl ?