What is a subscript ?
Answers were Sorted based on User's Feedback
Answer / santosh khot
Subcript is a working storage variable which gives the
occurance value of variable. Its main use is to access the
array elements.
| Is This Answer Correct ? | 4 Yes | 1 No |
Answer / b.rajesh
Number of occurrences of an element is known as subscript.
For storing of data we use the concept of SUBSCRIPT.
EX:-
WORKING-STORAGE SECTION.
01 section
02 marks pic 9(2) occurs 3 times.
77 I pic p(1).
PROCEDURE DIVISION.
move 1 to I.
perform until I > 3
accept marks(I)
add 1 to I
end-perform.
Here we declare the marks(I) : I is called as subscript.
| Is This Answer Correct ? | 1 Yes | 0 No |
Answer / ananta
Subcript : it is occurences of same type of records.
Ex-1.
01 arry.
02 a pic x(5) occures 5 times.
03 i pic 9.
ex-2.
01 rec-1.
02 rec1 pic x(5).
02 rec2 pic x(5).
02 rec3 pic x(5).
02 rec4 pic x(5).
02 rec5 pic x(5).
these 2 example shows that ex-2 can be writen in the form
of subcript .it make fast proccessing by usin g less I/o
sources.
| Is This Answer Correct ? | 1 Yes | 1 No |
Suppose i have a variable with s9(18)v99 comp3 . what is the size of variable . If s9(18) comp3 is 10 bytes . There should be some difference between two allocations ? Thanks krishna chaitanya
can we use COPY statement in w-s section? how?
how can u redefine picx(10) with pic 9(6).
can internal sort be applied to sort ksds files?
How to fetch 1000 error records from VSAM file(Eg: 1000000 records present) while getting SOC7 abend ?
How to read a record from bottom of a file which is indexed by 'A'.
how many bytes does a s9(12)COMP-4 field occupy?? a.2 b.4 c.8 d.1 ans with reason please
In an EVALUTE statement is the order of the WHEN clauses significant?
here is my compile and link edit steps in a jcl //COMPILE1 JOB (3CUS,S),'CCDM TEST' //STEPNAME EXEC PGM=IGYCRCTL,PARM='DYNAM,RENT,LIB,OBJECT, // OFFSET,APOST,OPTIMIZE',REGION=4096K //STEPLIB DD DSNAME=PM7351.TEST2.COB,DISP=SHR //SYSIN DD DSNAME=PM7351.TEST2.COB(PGM1),DISP=SHR //SYSUT1 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT2 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT3 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT4 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT5 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT6 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT7 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSPRINT DD SYSOUT=* //SYSLIN DD DSNAME=&&LOAD,DISP=(MOD,PASS),UNIT=SYSDA, // SPACE=(10,(10,10)),DCB=BLKSIZE=400 //LKED EXEC PGM=IEWL,REGION=1024K //SYSPRINT DD SYSOUT=A //SYSLIB DD DSN=PM7351.TEST2.LOADLIB,DISP=SHR // DD DSN=PM7351.TEST2.COB(PGM1),DISP=SHR //SYSLMOD DD DSN=PM7351.TEST2.LOADLIB, // DISP=SHR //SYSUT1 DD UNIT=SYSDA,DCB=BLKSIZE=1024,SPACE=(CYL,(1,1)) //SYSTERM DD SYSOUT=* //SYSLIN DD DSN=&&LOAD,DISP=(OLD,DELETE) //SYSIN DD DUMMY i am getting IEW2013I 0F08 NO MEMBER NAME WAS SPECIFIED. MODULE WAS SAVED USING TEMPNAM1. could any one tell me the resolution for this..?
What are the differences between OS VS COBOL and VS COBOL II?
What type of SDLC u followed? Why?
I encountered an error when I move spaces to a numeric field?What should I do to move spaces on that field?help please.