Skip to content
Snippets Groups Projects
Commit d85f3373 authored by rdubner's avatar rdubner
Browse files

Ibid.

parent 0b1ebb1e
No related branches found
Tags releases/gcc-13.1.0
No related merge requests found
Pipeline #1306 passed
......@@ -848,7 +848,7 @@ AT_DATA([prog.cob], [
05 X PIC A(4) VALUE "ABC".
05 E REDEFINES X PIC A(1) OCCURS 4.
LINKAGE SECTION.
77 B PIC A BASED.
77 B PIC A.
PROCEDURE DIVISION.
set P to address of E(1).
......@@ -856,7 +856,7 @@ AT_DATA([prog.cob], [
display FUNCTION trim(x) '.'
set address of B to p.
perform test after until B = SPACE
perform until B = SPACE
display B no advancing
set p up by 1
set address of B to p
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment