Image description: three-dimensional table
This image presents the three-dimensional table shown below.
01 SAMPLE-TABLE-THREE.
05 TABLE-DEPTH OCCURS 2 TIMES.
10 TABLE-ROW OCCURS 2 TIMES.
15 TABLE-COLUMN OCCURS 3 TIMES.
20 TABLE-ITEM-1 PIC X(2).
20 TABLE-ITEM-2 PIC X(1).
An associated storage outline depicts two contiguous blocks of storage, TABLE-DEPTH(1) and TABLE-DEPTH(2). Each block of TABLE-DEPTH contains two contiguous occurrences of TABLE-ROW. Each TABLE-ROW contains three contiguous occurrences of TABLE-COLUMN.
End of image description.