IBM DB2 Question:
Download Job Interview Questions and Answers PDF
Give the COBOL definition of a VARCHAR field.
Answer:
A VARCHAR column REMARKS would be defined as follows:
...
10 REMARKS.
49 REMARKS-LEN PIC S9(4) USAGE COMP.
49 REMARKS-TEXT PIC X(1920).
...
10 REMARKS.
49 REMARKS-LEN PIC S9(4) USAGE COMP.
49 REMARKS-TEXT PIC X(1920).
Download IBM DB2 Interview Questions And Answers
PDF
Previous Question | Next Question |
What is the diff bet plan,package,dbrm? | When can an insert of a new primary key value threaten referential integrity? |