Wrong line number in syntax error message

In some cases, syntax error message refer to the line after the actual error. In this case, the undeclared variable Foo is used on line 5, but the error message refers to line 6.

   IDENTIFICATION DIVISION.
   PROGRAM-ID. wrong-line-syntax-error.

   PROCEDURE DIVISION.
       MOVE ZERO TO Foo
       DISPLAY "Hello"
       STOP RUN.

$ gcobol bug-wrong-line-syntax-error.cbl -o bug-wrong-line-syntax-error bug-wrong-line-syntax-error.cbl:6: syntax error: symbol 'Foo' not found at 'DISPLAY' cobol1: error: failed compiling bug-wrong-line-syntax-error.cbl $