>
> <snip>


> I am trying to to the following in A LE Cobol 4.1 program, a STC . I have
> specified a Select for the file ....
>
>  SELECT FILEOUT
>                   ASSIGN       TO FILEOUT
>                   ORGANIZATION IS SEQUENTIAL
>                   FILE STATUS  IS FILEOUT-STATUS.
>
> I build the BPXWDYN call like this:
>
> *** Working Storage ***
>
>       01  DYNAM-CONSTANTS.
>            05 BPXWDYN-PGM       PIC X(8) VALUE 'BPXWDYN'.
>
>        01  BPXWDYN-PARM.
>            10 BPXWDYN-PARM-LEN  PIC S9(4) BINARY VALUE +100.
>            10 BPXWDYN-PARM-TXT  PIC X(100).
>
>         01  DYNSYSOUT-TEMP.
>            10 FILLER            PIC X(18) VALUE ' ALLOC DD(FILEOUT)'.
>            10 FILLER            PIC X(8) VALUE ' SYSOUT('.
>            10 SYSOUTCL          PIC X     VALUE SPACE.
>            10 FILLER            PIC X(10) VALUE ' MSG(WTP)'.
>
<snip>

Perhaps it is just a cut and paste error in the original post, but there is
not ')' for the sysout parameter.

----------------------------------------------------------------------
For IBM-MAIN subscribe / signoff / archive access instructions,
send email to lists...@bama.ua.edu with the message: GET IBM-MAIN INFO
Search the archives at http://bama.ua.edu/archives/ibm-main.html

Reply via email to