This discussion has been locked.
You can no longer post new replies to this discussion. If you have a question you can start a new discussion

RM/COBOL :- File Status = 9847 for Sequential File

Hi - 

I have huge Sequential file. Containing Binary data. One of the record is causing 9847 File Status. 

Problem is :- I cannot delete the record.  This is regular occurrence. Is there any way can I ignore this record and continue processing to next record ?

Tags:

Parents Reply Children
  • 0 in reply to 

    Thanks Tom.

    <<Please show/attach the SELECT statement and the record description.>>

     SELECT AUDIT
                  ASSIGN TO DISC
                  ORGANIZATION IS SEQUENTIAL
                  ACCESS MODE IS SEQUENTIAL
                  FILE STATUS IS FG4AUD-STATUS-CODE

    FD AUDIT
          RECORD VARYING 0 TO 4096 CHARACTERS DEPENDING ON REC-LEN
          LABEL RECORD IS STANDARD

    01 AUD--REC. |
        03 AUD--RECNAME   PIC X(12).
        03 AUD--TERMNO     PIC X(2).
        03 AUD--DATE           PIC 9(6) COMP-6.
        03 AUD--TIME            PIC 9(6) COMP-6.
        03 AUD--FUNC          PIC X.
        03 AUD--USER          PIC X(12).
        03 AUD--RELKEY      PIC 9(6) COMP-6.
        03 AUD--DATA            PIC X(4058).