Image description: two-dimensional table
This image presents the two-dimensional table shown below.
01 SAMPLE-TABLE-TWO.
05 TABLE-ROW OCCURS 2 TIMES.
10 TABLE-COLUMN OCCURS 3 TIMES.
15 TABLE-ITEM-1 PIC X(2).
15 TABLE-ITEM-2 PIC X(1).
An associated storage outline depicts two contiguous blocks of storage, TABLE-ROW(1) and TABLE-ROW(2).
Each occurrence of TABLE-ROW contains three contiguous occurrences of TABLE-COLUMN in the following left-to-right order: TABLE-COLUMN(1), TABLE-COLUMN(2), TABLE-COLUMN(3). Each TABLE-COLUMN contains one occurrence of TABLE-ITEM-1 followed by one occurrence of TABLE-ITEM-2.
End of image description.