how to display date in reverse order if the pic clause of
the is numeric
suppose date is 09032010 ==> need to print in 20100309
(pic clause is numeric)
Answers were Sorted based on User's Feedback
Answer / reshma j.
INPUT-DATE has value of 09032010.
In working storage:
01 INPUT-DATE.
03 MM1 PIC 9(2).
03 DD1 PIC 9(2).
03 CCYY1 PIC 9(4).
01 PRINT-DATE.
03 CCYY2 PIC 9(4).
03 DD2 PIC 9(2).
03 MM2 PIC 9(2).
In Procedure Division:
MOVE MM1 TO MM2.
MOVE DD1 TO DD2.
MOVE CCYY1 TO CCYY2.
After Moving values,PRINT-DATE value will be 20100309.
In this cond,Its totally depend on how we declare format in
working storage section.
plz let me know,if i m wrong.
| Is This Answer Correct ? | 14 Yes | 1 No |
Answer / tata
id division.
program-id. exe.
data division.
working-storage section.
01 idate pic 9(8) value 10032010.
01 rdate pic 9(8).
procedure division.
move idate (1:2) to rdate (7:2).
move idate (3:2) to rdate(5:2).
move idate (5:4) to rdate(1:4).
display rdate.
stop run.
| Is This Answer Correct ? | 10 Yes | 0 No |
Answer / rajesh
Both the answers are correct. But if we want to use the date
or month or year value alone in somewhere in our program
then we can go with Reshma's explanation.
| Is This Answer Correct ? | 3 Yes | 1 No |
Answer / nanda
*********************** Top of Data ****
ID DIVISION.
PROGRAM-ID. ALLINONE.
ENVIRONMENT DIVISION.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 WS-DATE1.
05 DD PIC 9(2).
05 MM PIC 9(2).
05 YY PIC 9(4).
01 WS-DATE2.
05 YY PIC 9(4).
05 MM PIC 9(2).
05 DD PIC 9(2).
PROCEDURE DIVISION.
ACCEPT WS-DATE1.
MOVE CORR WS-DATE1 TO WS-DATE2.
DISPLAY WS-DATE1.
DISPLAY WS-DATE2.
STOP RUN.
| Is This Answer Correct ? | 1 Yes | 0 No |
Answer / aruna
both the ans are coreect.in reshma's ans directly we can
write corr mve statement behalf of those 3move
statements.simply we can write move corr input-date to
output-date.
| Is This Answer Correct ? | 0 Yes | 1 No |
How do u sort the table for Search ALL? Is it only using ASCENDING KEY IS statement in occurs clause? If the data is input in non ascending order, will the ASC KEY IS automatically sort the data? or will it throw compile time error?
input:- A 10 20 30 40 B 5 7 10 14 C 8 12 14 16.... output:- A = 100,B=36,C=50. Here spaces are considered between numbers. When we give input as above, the numbers should be added n displayed.So please help me out.
I have a occurs for 100 times but it has executed 101 time what could be the reason?
how we sort two input files based on a common column and giving one o/p file please send me the coding logic?
What will happen if a variable is declared as below.. Explain with an example? Working storage section:- 01 WS-VARX PIC X(9) VALUE SPACES. 01 WS-VARN REDEFINES WS-VARX PIC 9(9).
have in 100 records in a flat file i want to move records like 1,3,5,7,9,11,.. to Output file1 and 2,4,6,8,10,12,14 .. records moved to Output file2..Pls Provide real time answer..
What does MAXCC 3 means? It is used in one my codes.
Are you comfortable in cobol or jcl?
Differentiate between structured cobol programming and object-oriented cobol programming.
Define static linking and dynamic linking.
What does the IS NUMERIC clause establish ?
When and how can we use index & subscript ?