HELPLIB.HLB  —  COBOL  DATA_DIVISION, miscellaneous_topics, record_alignment_boundaries
  The alignment boundaries for a record are shown in the following table.
  The boundary is the leftmost location of the one-, two-, four-, or
  eight-byte area.  All boundaries are relative to the beginning of the
  record.

  +-----------------------------------------------+
  |0 0 0 0 0 0 0 0 0 0 1 1 1 1 1 1 1 1 1 1 2 2 2 2|  SYNCHRONIZED clause
  |0 1 2 3 4 5 6 7 8 9 0 1 2 3 4 5 6 7 8 9 0 1 2 3|    affects these
  |-----------------------------------------------|      Data Types
  |B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|B|  v--------v--------v
  |---+---+---+---+---+---+---+---+---+---+---+---|
  |2by|2by|2by|2by|2by|2by|2by|2by|2by|2by|2by|2by|COMP PIC 9 to 9(4)
  |-------+-------+-------+-------+-------+-------|
  |4-byte |4-byte |4-byte |4-byte |4-byte |4-byte |COMP PIC 9(5) to 9(9)
  |               |               |               |COMP-1  POINTER  INDEX
  |---------------+---------------+---------------|
  |8-byte         |8-byte         |8-byte         |<-----+
  +-----------------------------------------------+      |
                                                       COMP-2

                                                 COMP PIC 9(10) to 9(18)
Close Help