input:-AABBCCDDEFGHIIJ
output:- ABCDEFGHIJ
Here in input we hav the duplicate characters i.e repeating
characters.SO we should eliminate the duplicate characters
and should display the output in ascending order.
Answers were Sorted based on User's Feedback
Answer / shekh
let me correct u Vaneesh.
we need to check each character. load the string to array & use condition.
perform para until eof
if ws-char (a) = ws-char (a + 1)
continue
else move ws-char (a) to ws-string (b).
define the variables accordingly.
Is This Answer Correct ? | 0 Yes | 0 No |
Answer / sudhansu
ID DIVISION.
PROGRAM-ID. TESTPRG4.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 WS-VAR.
10 WS-VARA PIC X(20).
10 WS-VARB PIC X(20).
10 I PIC 99.
10 J PIC 99 VALUE 1.
10 OCR PIC 99 VALUE 1.
10 WS-TAB.
20 WS-REC OCCURS 10 TIMES.
30 WS-ID PIC X(1) .
PROCEDURE DIVISION.
ACCEPT WS-VARA.
MOVE 'A' TO WS-HOLD.
PERFORM VARYING I FROM 1 BY 1 UNTIL I > 20
MOVE WS-VAR(I:1) TO WS-ID(OCR)
ADD 1 TO OCR
END-PERFORM.
PERFORM VARYING OCR FROM 1 BY 1 UNTIL OCR > 20
IF WS-REC(OCR) NOT EQUAL TO WS-REC(OCR + 1) THEN
MOVE WS-ID(OCR) TO WS-VARB(J:1)
ADD 1 TO J
ELSE
CONTINUE
END-IF
END-PERFORM.
DISPLAY WS-VARB.
STOP RUN.
Is This Answer Correct ? | 0 Yes | 0 No |
Answer / adithya
//job card
//step1 exec pgm=sort
//sortin dd dsn=adi.in
//sortout dd sysout=*
//sysout dd sysout=*
//sysin dd *
sort fields=(1,15,ch,a)
sum fields=none
/*
Is This Answer Correct ? | 2 Yes | 3 No |
Here I am considering INPUT to COBOL working storage
variable and not from file. (If it is input from file then
answer above by Adithya is right).
01 WS-INPUT PIC X(52) VALUE 'AABBCCDDEFGHIIJ.....ZZ'
05 WS-ALPHABET-INP PIC X OCCOURS 52 TIMES.
01 WS-OUPUT PIC X(26).
05 WS-ALPHABET-OUT PIC X OCCOURS 26 TIMES.
01 SUBSRIPTS
05 WS-SUBA PIC 9(2).
05 WS-SUBB PIC 9(2) VALUE 1.
PROCEDURE DIVISION.
PERFORM VARYING WS-SUBA FROM 2 BY 2 UNTIL WS-SUBA > 52
MOVE WS-ALPHABET(WS-SUBA) TO WS-ALPHABET-OUT(WS-SUBB)
ADD +1 TO WS-SUBB
END-PERFORM.
DISPLAY WS-OUPUT
STOP RUN.
Is This Answer Correct ? | 0 Yes | 1 No |
Answer / venkat
use the sort procedure in cobol and if u want duplicates
kept with duplicates otherwise leave it ...
and ascending order..u now that one..
thank u
if it works reply me ..else
correct me..
Is This Answer Correct ? | 0 Yes | 5 No |
Answer / subbu
We can eliminate the duplicates using sort.
please find the control card for sort.
sort fields = (starting position of field,length of the
field,data type,ascending or descending order)
sum fields=none
Is This Answer Correct ? | 1 Yes | 7 No |
What is the different between index and subscript?
How do define Dymanic array in cobol how do u define single demensional arry and multidymensional arry in ur cobol.
Which division and paragraphs are mandatory for a COBOL program?
if a file has 1000 recods how copy the records from 1 to 100 records using sort
where will u code file status ?
how will u code parm parameter and where pls ?
With in these three which one is the default one Call Reference, Call By Value, Call By Content.-Which one is default?
How to read a record from bottom of a file which is indexed by 'A'.
what is the meaning of pic 9(09)v99-
Which of the following paragraphs is compulsory in every COBOL program? (a) SPECIAL-NAMES (b) PROGRAM-ID (c) FILE-CONTROL (d) OBJECT-COMPUTER
What are the different rules of SORT operation?
What is the difference between write & move in COBOL?