Give the COBOL definition of a VARCHAR field.
Submitted by: AdministratorA VARCHAR column REMARKS would be defined as follows:
...
10 REMARKS.
49 REMARKS-LEN PIC S9(4) USAGE COMP.
49 REMARKS-TEXT PIC X(1920).
Submitted by: Administrator
...
10 REMARKS.
49 REMARKS-LEN PIC S9(4) USAGE COMP.
49 REMARKS-TEXT PIC X(1920).
Submitted by: Administrator
Read Online IBM DB2 Job Interview Questions And Answers
Top IBM DB2 Questions
☺ | what are the bind parameters IBM DB2? |
☺ | What is sqlcode -811? |
☺ | What is sqlcode -922 ? |
☺ | Cursors can be declared in both working-storage & procedure |
☺ | Can you have more than one cursor open at any one time in a program ? |
Top Databases Programming Categories
☺ | RDBMS Interview Questions. |
☺ | SQL Interview Questions. |
☺ | SSRS Interview Questions. |
☺ | Sybase Interview Questions. |
☺ | Database Administrator (DBA) Interview Questions. |