Image description: one-dimensional table
This image presents a one-dimensional table as shown below.
01 SAMPLE-TABLE-ONE.
05 TABLE-COLUMN OCCURS 3 TIMES.
10 TABLE-ITEM-1 PIC X(2).
10 TABLE-ITEM-2 PIC X(1).
An associated storage outline shows that the group SAMPLE-TABLE-ONE contains three contiguous occurrences of TABLE-COLUMN. Each occurrence of TABLE-COLUMN has three positions of storage: two positions for TABLE-ITEM-1 followed by one position for TABLE-ITEM-2.
End of image description.