TCS COBOL PAPER
QUESTIONS
1) Consider the following piece of code:
01 GROSS PAY
05 BASIC PAY pic 9(5)
05 allowances pic 9(3)
If basic pay has a value of 1000 and allowances has the value 250, what
will be displayed by
the following statement
Display gross pay
a)1250 b) 0 1000 250 c) 0 1250 d) 1,250
2) 77 W-A PIC 9(3) v99 value 23.75
77 W-B PIC zzgv99 value 123.75
Move W-A to W-B, then W-B=?
a)123.75 b)b23.75 c)023.75 d)invalid
3) Divide A into B giving C
a)C=A/B b) the remainder of B/A is stored in C
c)C=B/A d) the remainder of A/B is stored in C
4) If A(numeric) Display A
A is
a) numeric b) alpha c) alphanumeric d) numeric/alpha numeric
5) Which is check protection symbol
a) Z b) $ c) * d) +
6)..........PIC A(1)
01 c PIC 9(4)
If B(numeric) add 10 to C
a) the condition 'if' is wrong
b) nothing is wrong
c) C is not initialized, 'add 10 to c' is wrong
d) both b and c should be same size.
7) 01 A1
05 b pic 99
05 c pic X(4)
01 A2
05 b pic 99v99
05 c pic A(4)
which is true?
a) A1 and A2 cannot have same subordinates
b) A1 and A2 can have same subordinates but should be same pic clause
c) nothing wrong
d) A1 and A2 cannot have same subordinate provided they are not at a level
8) 01 A pic 99v9 value 5
01 B pic 9v9 value 6
01 C pic 99v9 value 2.5
01 D pic 99 value 3
compute A rounded B,C=(A+B*C/D) on size error perform point error.
A,B,C are
a) 10,0,10 b)10,0,9.9 c)10,9.9,9.9 d)10,6,10
9)How many time para A is performed
Perform para A varying time counter
from 1 by 1 until timer counter > 10
PARA-A
Move p to 9
Move 10 to times counter
a) 10 b) 1 c) 11 d) 0
10) 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
amount-1?
a) 50 b) 100 c) 0 d) not defined
11) Move to sw no of REC
Perform PRT-OUT until sw=1
Display no of REC
Stop run
PRT-OUT
READ IN FILE AT END MOVE 1 TO SW
WRITE OUT-REC FROM IN-REC
Add 1 to no of REC
File has 1000 RECS .......... displayed the perform.
Assume NO_OF REC pic 9(4)
a) 1000 b)100 c)1 d) mere syntax error
12) Big question
13) C1,C2,C3 C1-true C2-false C3-true
A. C1 AND (NOT C2) OR C3
B. (NOT C1) OR (NOT C2 AND NOT C3)
C. (C1 OR C2) AND C3
D. C1 AND C2 OR C3
a) A,B,C are true
b) A,C,D are true
c) A,B,C,D are true
d) C,D are true
14) FD FILE-1
01 REC-1 pic X(80)
working storage section
01 W-REC pic X(90)
PROCEDURE DIVISION
FIRST-PARA
READ FILE-1 into W-REC
At END MOVE 1 to EOF flag
which is true
a) REC-1 contains nothing and W-REC has contents of record read
b) REC-1 and W-REC contain the same data
c) Syntax invalid and syntax error
d) REC-1 and W-REC must have same size
15) PERFORM ACCUMULATE Totals if executed
varying A from 1 by 2 until A>2
Alter B from 1 by 1 until B>2
Alter C from 2 by -1 until C<1
a) 18 times b) 4 times c) 8 times d) 24 times
16) FILE-ORGANIZATION IS INDEXED
read, records in random also sequentially in which access mode ?
a) sequential b) random c) dynamic d) nothing
17) This is PROCEDURE DIVISION ENTRY
OPEN EXTENDED IN FILE
correct organization of IN-FILE is sequential and.........
a) sequential & records can be added in beginning
b) sequential & records can be added in the end
c) Index and records can be added in the beginning
d) Index and records can be added in the end
18) size of W-REC
01 W-REC
05 A pic 9(4)v99
05 B redefine A
10 C pic XX
10 D pic s9(4)
05 E occurs 7 pic ZZ ZZ
05 F occurs 5
10 occurs pic zz,zzz 99
...................
15 J pic 59(8)
15 K pic v99
a) 177 b)161 c)150 d) none
19) If X and Not Y move A to B
If Z=1 or 9 MOVE A to B
select one of the following data division which gives result
a) 01 z pic 9
88 X VALUE 1,9
88 y VALUE 0,2 through 8
b) 01 z pic 9
88 X value 0,2 through 8
88 Y value 1,9
c) 01 z pic 9
88 X value 1,9
88 NOT-Y value 0,2 through 8
d) NONE
20) MOVE 10 TO N
PERFORM PARA-X N TIMES
STOP RUN
PARA-X
Move 5 to n
Para-x will be executed how many times?
a) 10 b) 5 c) 0 d) error
21) If A less 1200 ( if B greater than 25)
Move 47 to c
Else move 57 to c
If A greater 249 Move 67 to c else next sentence
else if B less 67 move 27 to c
what is c if A=137 and B=25
a) 27 b) 57 c) 67 d) none
22) 77A pic 9v9 value 9.5
77A pic 9 value 9
77C pic v9 value 0.8
77D pic 9
77E pic 9
77f pic 9v999
D,E,F are ?
COMPUTE F ROUNDED = A+C/B
MULTIPLY A BY C GIVING E
ADD B C A GIVING D ROUNDED
a)F=9.589 E=8 D=1 b) F=9.589 E=8 D=9
c) F=9.589 E=7 D=9 d) F=9.589 E=7 D=1
23) 77 w-NUN PIC 9 value 0
MOVE 1 To w-NUN
PERFORM PARA-X UNTIL W-NUN>9
PARA - X
add 1 to w-NUN
How many times PARA x would be created ?
a) 10 b) 9 c) 11 d) 0
24) 77 A PIC 99V99 value 55 35
77B PIC 99V999 value 32754
Add B to A on size erreor display error results
a) A = 88.10 B = 32.754 b) A = 87.60 B =32.754
c) A = 87.10 B = 32.754 d) error
25) 77 A pic 9(10)
77 B pic 9(10)
77 C pic 9(19)
Multiply A by B giving C, which is true
a) execution may give on size error
b) execution will give on size error
c) det of C invalid results in compile error
d) No error
26) A paragraph para-x is executed when none of the data names A,B,C have
value of 1 which
achieves this:
a) If A not= 1 or B not= 1 or C not= 1
b) if Not A =1 and B=1 and C=1
c) if A not=1 if not B=1 or C=1
d) if A not=1 and B not=1 and C not =1.
27) Expression | Class
--------------------------------------------------------------------------------------
1. "Spaces" | figurative constant
2. "Depreciation schedule" | non numeric literal
3. "12%" | non numeric literal
4. zeros | figurative constant
---------------------------------------------------------------------------------------
a) 1 and 3 are incorrect
b) 1 and 4 are correct
c) 3 and 4 are correct
d) all are correct
28) Identify Invalid Data name
a) SAVING-ACCOUNT b) ANNUAL-ALLOCATION-FOR-OVERHEAD
c) $AMOUNT 250 d) AIZDN
29)End-of -file-switch pic xxx
88 No-More-RECS value "yes"
88 More RECS value "No"
i) Read sample-file at END MOVE "yes" to No-More-RECs
ii) If No-More-RECs-EQUL "yes" GO TO LAST PARA
iii) if No-More-RECs Go to LAST PARA
a) i and ii are wrong
b) ii and iii are correct
c) i and iii are correct
d) all are correct
30) Working storage section
01 DATE-TODAY
05 yy pic xx value "90"
05 mm pic xx value "12"
05 dd pic xx value "31"
DATE-ELIT pic xx/xx/xx
.....DATE TODAY TO DATE EDIT
31) How many bytes allocated?
REC A
05 A pic 89(4)
05 B pic XXXBXXX
05 C pic XX,XX9.99
05 D pic 89(5) comp-3
05 E pic 9(3) comp
a) 9 b) 26 c) 25 d) 28.
32) W-DATE pic X(6)
05 DD pic 99
05 MM pic 99
05 YY pic 99
a) nothing wrong b) under W-C all level 05 items are having pic 99
but level has pic X(6)
c) pic can't be specified for a group item d) DD,MM,YY invalid datanames
33) If
consider the following
05 X pic 99 value 10
SUBTRACT 20 FROM X . result = ___________
a)10 b) infinity c) compile error d) none
34) 88 lead used for
a) data item in W-5 section b) item with ................
c) condition names d) none
35) compute X= A*B-C*D and
compute X= (A*B)-(C*D)
a) are not same b) are same
c) syntactically wrong d) will lead to run time error
36) occurs always used in data division 100 data name at
a) 01 level b) 77 level c) 88 level d) 02 to 49
37) 05 X pic 99 value 10
Add 40x to X
compute X= 3X-40. X=_______________
a) 10 b) 40 c) compile and run error d) none
38) The hierarchy of execution of logical operator is
a) NOT,AND,OR b) AND,OR,NOT c) OR,AND,NOT d) OR,NOT,AND
39) Given the following piece of code:
call sub-pgm using A,B,C
call sub-pgm using A,B,C
a) both call statements will always produce the same result
b) both call statements may produce different result
c) compile time error because sub-prg is .........
d) compile time error because A,B,C is used .........
40) The order of precedence of arithmetic operators can be overridden by:
a)[ ] b) () c){ } d) any of the above
41)What para is compulsory for every COBOL programmming
a) SPECIAL NAME b) PROGRAM ID c) FILE CONTROL d) object compute
42) which of the following can be opened in all modes INP,I-O,O/P etc..,
a) Indexed b) relative c) sequential d) all
43)which of the following editing pic symbol is to be used if negative is
to appear before the
value if the value is positive?
a) + b) - c) + or - d) not possible
44)some loop program
For Questions 45 to 49 read the following:
under the following condition
01 PRICE-LIST
03 BRAND OCCURS 25
05 BRAND SIZE OCCURS 4
07 PRICE PIC 999
07 DISCOUNT PIC 99
Pick out the valid identifiers for the following
45) How many data names?
46) Total amount
47) Amount for item
48) No of if and else states
49) What is in Madras.
#################################################################################################
SOLUTIONS
1. B
2. B
3. C
4. C
5. C
6. A
7. C
8. D
9. B
10. A
11. C
12. C
13. B
14. B
15. B
16. C
17. B
18. B
19. D
20. A
21. B
22. C
23. B
24. A
25. A
26. D
27. A
28. C
29. A
30. 90/12/31
31. C
32. C
33. A
34. C
35. B
36. D
37. C
38. A
39. B
40. B
41. B
42. C
43. A
44. STD IN 1
STD IN 2
END
45. 5
46. 9(8)V99
47. 9(8)V99
48. 3
49. ZZ,ZZ,Z99V99
################################################################################################
Some Extra Questions in COBOL: Answers are marked as **
1. In a routine in the input procedure RELEASE verb is used to write
records into the **A)sort file B)output file C)merge file D)none
2.Which of the following is true:
ans. 77 level must begin with AREA-A
88 level must begin with AREA-B
3.which one of the following is true:
ans. a copy statemene must be terminated by the period.
4. consider the following piece of code:
01 A PIC 99 VALUE 65
01 B PIC 99 VALUE 57
01 C PIC 99 VALUE 19
ADD A B GIVING C ON SIZE ERROR ADD A TO C DISPLAY C
What will be the output
A)22 **B)84 C)19 D) can't say
5. ON OVERFLOW exception can be applied to
A) STRING ONLY
B) UNSTRING ONLY
**C) STRING , UNSTRING and CALL
D) CALL ONLY
6.which of the following OPEN MODE is not applicable to INDEXED files
A) INPUT **B)EXTENDED C) OUTPUT D)I-O
7.BY default alternate key is assumed to be
A) NON UNIQUE B)THERE IS NO DEFAULT **C)UNIQUE D)not permitted
8.The execution of which of the following statement in a sub program
returns calling program A)EXIT **B)EXIT PROGRAM C)STOP RUN D)CONTINUE
9. In a MOVE involving only numeric integer items if the receiving field
is larger than the sending field
A) left are filled with spaces
B)right are filled with spaces
C)right are filled with zeros
**D)left are filled with zeros
10. Identify the correct statement from the following :
A) the value clause in working storage section is used only with
elementary items
B)the VALUE CLAUSE always precedes the PICTURE CLAUSE
**C)the VALUE CLAUSE always follows PICTURE CLAUSE
D)the VALUE CLAUSE can either preced or follow the PICTURE CLAUSE
11. Non-numeric data can be _________ in the field
a)only left justified
b)only right justified
**c)both left and right justified
d).........
********************************************
HOME
YEAR N ORG
- C++ (1)
- CISCO 2000 (1)
- CISCO IN ISI (1)
- CISCO SELECTION PROCEDURE (1)
- CTS-JUNE-2005 (1)
- GD TIPS (1)
- GE-NIT-CALICUT-06 (1)
- HCL 1995 (1)
- HCL INTERIVIEW (1)
- HUGHES - 2003 (1)
- HUGHES DELHI 1997 (1)
- HUGHES-26/12/03 (1)
- I'VIE QNS TECH COMP (1)
- I'VIEW HOW TO DRESS (1)
- I'VIEW QNS AT EBAY (1)
- I'VIEW QNS ON C (1)
- I'VIEW QNS ORACLE (1)
- I'VIEW TIPS (TEAM) (1)
- I'VIEW TIPS 1 (2)
- I'VIEW TIPS 2 (1)
- I'VIEW TIPS 3 (1)
- I'VIEW TIPS 5 (1)
- I'VIEW WAY OF ANSWERING (1)
- IBM - 2006 (1)
- INFOSYS DCE DELHI 2K (1)
- INFOSYS 1997 (1)
- INFOSYS 1998 (1)
- INFOSYS CET 2000 (1)
- INFOSYS I'VIEW 05 (1)
- INFOSYS IISC (1)
- INFOSYS IISC 2K (1)
- INFOSYS IISC B'LORE (1)
- INFOSYS IITB 2000 (1)
- INFOSYS IITD 2000 (1)
- INFOSYS IT BHU 2K (1)
- INFOSYS PAPER (1)
- INFOSYS PAPR 97 (1)
- INFOSYS QNS (1)
- INFOSYS QYESTIONS (1)
- INFOSYS TECH LTD (1)
- INFOSYS VJIT 2000 (1)
- INFOSYS-BANGLORE-2006 (1)
- interview tips (1)
- ORACLE CANDIDATE EXP (1)
- ORACLE CHENNAI 13/07/03 (1)
- Oracle OFF CAMP (1)
- ORACLE-2001 (1)
- ORACLE-GUIDANCE (1)
- ORACLE-NITK-11/07/03 (1)
- ORACLE-OF CAMPUS 22/06/06 (1)
- ORACLE-OFCAMP -21/06/03 (1)
- ORACLE-OFCAMP 21/06/03 (1)
- ORACLE-OFCAMP-JULY 2003 (1)
- ORACLE-RECW-2003 (1)
- PATNI 1999 (1)
- RESUME 2 (1)
- RESUME 3 (1)
- RESUME 4 (1)
- RESUME 5 (1)
- RESUME 6 (1)
- RESUME 7 (1)
- SAS (1)
- SASKEN SEP 2003 (1)
- SATYAM 2K3 (1)
- SATYAM 2003 (1)
- SATYAM PAPER (1)
- SATYAM PAPER - GD (1)
- SATYAM PAPER CAND EXP (1)
- SATYAM PATTERN (1)
- SATYAM SAMPLE TEST (1)
- SATYAM2003 (1)
- SQL (1)
- Tcs (1)
- TCS - 2006 (1)
- TCS -JADAVPUR UNI 99 (1)
- TCS 01/07/06 PAPER I'VIEW (1)
- TCS 1998 (2)
- TCS 2000 (1)
- TCS 2003 (1)
- TCS B'LRE 23/09/06CAND EXP (1)
- TCS CAND EXPERIENCE (1)
- TCS CHENNAI 10/12/06 (1)
- TCS COBOL PAPER (1)
- TCS HYD 07/10/06 (1)
- TCS HYD 07/10/06 CAND EXP (1)
- TCS I'VIEW (1)
- TCS MODEL PAPER (1)
- TCS PAPER (1)
- TCS PAPER 1998 (1)
- TCS PAPER 2000 (1)
- TCS PAPER I'VIEW 24/07/06 (1)
- TCS PAPER1 (1)
- TCS PATTERN CAND EXP (1)
- TCS PONDY 02/06/07 I'VIEW (1)
- TCS RANCHI 24/07/06 (1)
- TCS ROORKEE 31/07/97 (1)
- TCS SAMPLE TEST 1 (1)
- TCS SAMPLE TEST 2 (1)
- TCS TALENT TEST 1 (1)
- TCS-HYD-20/10/06 (1)
- TEX TECH TEST 2003 (2)
- TEXAS PAPER 2000 (1)
- TEXAS 1999 (1)
- TEXAS 28/07/08 (1)
- TEXAS CSE 2001 (1)
- TEXAS IISc (1)
- TEXAS IITB (1)
- TEXAS IITK (1)
- TEXAS INSTR PAPER (1)
- TEXAS JADAVPUR 99 (1)
- TEXAS PAPER (1)
- TEXAS REC 2000 (1)
- wipro (1)
- WIPRO 1995 (1)
- WIPRO 1999 (1)
- WIPRO 2000 (1)
- WIPRO 2K (2)
- WIPRO INTERVIEW (1)
- WIPRO INTERVIEW 95 (1)
- WIPRO JULY 1997 (1)
- WIPRO NITDURGAPUR 03 (1)
- WIPRO PAPER 2000 (1)
- WIPRO PROCESS B'LORE (1)
- WIPRO ROORKEE 2K (1)
- WIPRO SAMPLETEST 2 (1)
- WIPRO SAMPLETEST1 (1)
- WIPRO SMAPLETEST 3 (1)
- WIPRO SURAT 2002 (1)
- WIPRO TECH 2000 (1)
Thursday, April 19, 2007
Tcs COBOL paper
Posted by
pappuagloco
at
3:59 PM
Labels: TCS COBOL PAPER
Subscribe to:
Post Comments (Atom)
No comments:
Post a Comment