The following statement transfers the first 10 characters of the data-item referenced by WHOLE-NAME to the data-item referenced by FIRST-NAME.
77 WHOLE-NAME PIC X(25). 77 FIRST-NAME PIC X(10).The following statement transfers the last 15 characters of the data-item referenced by WHOLE-NAME to the data-item referenced by LAST-NAME.
.
.
.
MOVE WHOLE-NAME(1:10) TO FIRST-NAME.
77 WHOLE-NAME PIC X(25). 77 LAST-NAME PIC X(15).The following statement transfers the fourth and fifth characters of the third occurrence of TAB to the variable SUFFIX.
.
.
.
MOVE WHOLE-NAME(11:) TO LAST-NAME.
01 TABLE-1. 02 TAB OCCURS 10 TIMES PICTURE X(5). 77 SUFFIX PICTURE X(2).
.
.
.
MOVE TAB OF TABLE-1 (3) (4:2) TO SUFFIX.
Adobe, the Adobe logo, Acrobat, the Acrobat logo, and Acrobat Reader are registered trademarks of Adobe Systems incorporated.