2

3 つの VSAM ファイルがあります。1 つは顧客、ビデオ、およびレンタル用です。これらの VSAM ファイルでは、各顧客、ビデオ、およびレンタルに ID があります。以下は、顧客ファイルの例です。

300、ボブ、315-123-1414

301、ライアン、315-213-2617

302、スミス、315-123-1234

303、ロベルタ、212-125-1234

動画ファイルとレンタルファイルの設定方法は同じです。

私がしなければならないことは、これらの VSAM ファイルを読み取り、顧客、ビデオ、および顧客がレンタルしたビデオを一覧表示する COBOL プログラムを作成することです。顧客ごとに 1 つの ID 番号を持ち、レンタルしたビデオにその ID 番号を付けることで、これを行う予定です。

私がこれまでに持っているCOBOLコードは以下の通りです:

ID DIVISION.
    PROGRAM-ID. PROG3

    ENVIRONMENT DIVISION.
    CONFIGURATION SECTION.
    SOURCE-COMPUTER. IBM-Z10.
    OBJECT-COMPUTER. IBM-Z10.
    INPUT-OUTPUT SECTION.
    FILE-CONTROL.
         SELECT CUR-FILE ASSIGN TO MYFILE1
         ORGANIZATION INDEXED ACCESS IS SEQUENTIAL
         RECORD KEY IS EMP-NO FILE STATUS IS F13.

    DATA DIVISION.
    FILE SECTION.
    FD  CUR-FILE
        RECORD CONTAINS 80 CHARACTERS
        DATA RECORD IS CUR-REC.
      01 CUR-REC.
        02 EMP-NO      PIC X(6).
        02 EMP-NAME    PIC X(24).
        02 EMP-ADDRESS PIC X(50).
      WORKING-STORAGE SECTION.
      77 F13 PIC 99 VALUE ZEROS.


      PROCEDURE DIVISION.
      0001-MAIN.
          DISPLAY ' I M IN MAIN '.
          DISPLAY ' I M IN MAIN '.
          OPEN OUTPUT CUR-FILE. IF F13 = 00
          DISPLAY ' I M OPENED SUCCESSFULLY ' ELSE
          DISPLAY 'OPEN-ERROR ' F13 STOP RUN.
          MOVE '822655' TO EMP-NO.
          DISPLAY EMP-NO.
          MOVE 'MUSADDIQ USMAN' TO EMP-NAME.
          MOVE 'P-5/01 STEEL TOWN' TO EMP-ADDRESS.
          DISPLAY CUR-REC.
          WRITE CUR-REC.
          IF F13 = 00 DISPLAY 'WRITE SUCCESSFUL' ELSE
          DISPLAY 'WRITE ERROR ' F13 STOP RUN.
          CLOSE CUR-FILE.
          STOP RUN.

以下に Read プログラムを追加します。これが役に立てば幸いです。

ID DIVISION.
    PROGRAM-ID. RDVSAM.

    ENVIRONMENT DIVISION.
    CONFIGURATION SECTION.
    SOURCE-COMPUTER. IBM-Z10.
    OBJECT-COMPUTER. IBM-Z10.
    INPUT-OUTPUT SECTION.
    FILE-CONTROL.
         SELECT CUR-FILE ASSIGN TO MYFILE1
         ORGANIZATION INDEXED ACCESS IS SEQUENTIAL
         RECORD KEY IS EMP-NO FILE STATUS IS F13.

    DATA DIVISION.
    FILE SECTION.
    FD  CUR-FILE
        RECORD CONTAINS 80 CHARACTERS
        DATA RECORD IS CUR-REC.
      01 CUR-REC.
        02 EMP-NO PIC 9(6).
        02 EMP-NAME PIC X(24).
        02 EMP-ADDRESS PIC X(50).
    WORKING-STORAGE SECTION.
    77 F13 PIC 99 VALUE ZEROS.

    PROCEDURE DIVISION.
    0001-MAIN.
       OPEN INPUT CUR-FILE. IF F13 = 00
       DISPLAY ' I M OPENED SUCCESSFULLY ' ELSE
       DISPLAY 'OPEN-ERROR ' F13 STOP RUN.
    REAd-FILE.
       READ CUR-FILE AT END GO TO CLOSE-UP.
       DISPLAY EMP-NO ' ' EMP-NAME ' ' EMP-ADDRESS.
       GO TO READ-FILE.
    CLOSE-UP.
       CLOSE CUR-FILE.
       STOP RUN.

すべての情報を一覧表示する方法がわかりません。

ありがとうございました

4

2 に答える 2

2

INDEXED ファイルをスキャンする例についてはhttp://opencobol.add1tocobol.com/#does-opencobol-support-isamを参照してください。おそらくhttp://opencobol.add1tocobol.com/#relative (別のファイル組織)

注: これは単なるヒントです。手がかりを得るためにSTARTとREAD NEXTを見てください

OCOBOL >>SOURCE FORMAT IS FIXED
      *> ***************************************************************
      *><* ================
      *><* indexing example
      *><* ================
      *><* :Author:    Brian Tiffin
      *><* :Date:      17-Feb-2009
      *><* :Purpose:   Fun with Indexed IO routines
      *><* :Tectonics: cobc -x indexing.cob
      *> ***************************************************************
       identification division.
       program-id. indexing.

       environment division.
       configuration section.

       input-output section.
       file-control.
          select optional indexing
          assign to "indexing.dat"
          organization is indexed
          access mode is dynamic
          record key is keyfield of indexing-record
          alternate record key is splitkey of indexing-record
              with duplicates
          .

      *> ** OpenCOBOL does not yet support split keys **
      *>  alternate record key is newkey
      *>      source is first-part of indexing-record
      *>                last-part of indexing-record
      *>      with duplicates

       data division.
       file section.
       fd indexing.
       01 indexing-record.
          03 keyfield          pic x(8).
          03 splitkey.
             05 first-part     pic 99.
             05 middle-part    pic x.
             05 last-part      pic 99.
          03 data-part         pic x(54).

       working-storage section.
       01 display-record.
          03 filler            pic x(4)  value spaces.
          03 keyfield          pic x(8).
          03 filler            pic xx    value spaces.
          03 splitkey.
             05 first-part     pic z9.
             05 filler         pic x     value space.
             05 middle-part    pic x.
             05 filler         pic xx    value all "+".
             05 last-part      pic z9.
          03 filler            pic x(4)  value all "-".
          03 data-part         pic x(54).

      *> control break
       01 oldkey               pic 99x99.

      *> In a real app this should well be two separate flags
       01 control-flag         pic x.
          88 no-more-duplicates          value high-value
             when set to false is              low-value.
          88 no-more-records             value high-value
             when set to false is              low-value.

      *> ***************************************************************
       procedure division.

      *> Open optional index file for read write
       open i-o indexing

      *> populate a sample database
       move "1234567800a01some 12345678 data here" to indexing-record
       perform write-indexing-record
       move "8765432100a01some 87654321 data here" to indexing-record
       perform write-indexing-record
       move "1234876500a01some 12348765 data here" to indexing-record
       perform write-indexing-record
       move "8765123400a01some 87651234 data here" to indexing-record
       perform write-indexing-record

       move "1234567900b02some 12345679 data here" to indexing-record
       perform write-indexing-record
       move "9765432100b02some 97654321 data here" to indexing-record
       perform write-indexing-record
       move "1234976500b02some 12349765 data here" to indexing-record
       perform write-indexing-record
       move "9765123400b02some 97651234 data here" to indexing-record
       perform write-indexing-record

       move "1234568900c13some 12345689 data here" to indexing-record
       perform write-indexing-record
       move "9865432100c13some 98654321 data here" to indexing-record
       perform write-indexing-record
       move "1234986500c13some 12349865 data here" to indexing-record
       perform write-indexing-record
       move "9865123400c13some 98651234 data here" to indexing-record
       perform write-indexing-record

      *> close it ... not necessary, but for the example
       close indexing

      *> clear the record space for this example
       move spaces to indexing-record

      *> open the data file again
       open i-o indexing

      *> read all the duplicate 00b02 keys
       move 00 to first-part of indexing-record
       move "b" to middle-part of indexing-record
       move 02 to last-part of indexing-record

      *> using read key and then next key / last key compare
       set no-more-duplicates to false
       perform read-indexing-record
       perform read-next-record
           until no-more-duplicates

      *> read by key of reference ... the cool stuff
       move 00 to first-part of indexing-record
       move "a" to middle-part of indexing-record
       move 02 to last-part of indexing-record

      *> using start and read next
       set no-more-records to false
       perform start-at-key
       perform read-next-by-key
           until no-more-records

      *> read by primary key of reference
       move "87654321" to keyfield of indexing-record

      *>
       set no-more-records to false
       perform start-prime-key
       perform read-previous-by-key
           until no-more-records

      *> and with that we are done with indexing sample
       close indexing

       goback.
      *> ***************************************************************

      *><* Write paragraph
       write-indexing-record.
         write indexing-record
             invalid key
                 display
                     "rewrite key: " keyfield of indexing-record
                 end-display
                   rewrite indexing-record
                       invalid key
                           display
                               "really bad key: "
                               keyfield of indexing-record
                           end-display
                   end-rewrite
         end-write
       .

      *><* read by alternate key paragraph
       read-indexing-record.
           display "Reading: " splitkey of indexing-record end-display
           read indexing key is splitkey of indexing-record
         invalid key
             display
                "bad read key: " splitkey of indexing-record
             end-display
               set no-more-duplicates to true
           end-read
       .

      *><* read next sequential paragraph
       read-next-record.
           move corresponding indexing-record to display-record
           display display-record end-display
           move splitkey of indexing-record to oldkey

           read indexing next record
               at end set no-more-duplicates to true
               not at end
                   if oldkey not equal splitkey of indexing-record
                       set no-more-duplicates to true
                   end-if
           end-read
       .

      *><* start primary key of reference paragraph
       start-prime-key.
           display "Prime < " keyfield of indexing-record end-display
           start indexing
              key is less than
                  keyfield of indexing-record
              invalid key
                  display
                      "bad start: " keyfield of indexing-record
                  end-display
                  set no-more-records to true
              not invalid key
                  read indexing previous record
                      at end set no-more-records to true
                  end-read
           end-start
       .

      *><* read previous by key of reference paragraph
       read-previous-by-key.
           move corresponding indexing-record to display-record
           display display-record end-display

           read indexing previous record
               at end set no-more-records to true
           end-read
       .
      *><* start alternate key of reference paragraph
       start-at-key.
           display "Seeking >= " splitkey of indexing-record end-display
           start indexing
              key is greater than or equal to
                  splitkey of indexing-record
              invalid key
                  display
                      "bad start: " splitkey of indexing-record
                  end-display
                  set no-more-records to true
              not invalid key
                  read indexing next record
                      at end set no-more-records to true
                  end-read
           end-start
       .

      *><* read next by key of reference paragraph
       read-next-by-key.
           move corresponding indexing-record to display-record
           display display-record end-display

           read indexing next record
               at end set no-more-records to true
           end-read
       .
       end program indexing.
于 2013-03-02T23:49:53.453 に答える
1

OK、IBM Cobol マニュアルは、VSAM のおかげで IBM がオンラインで入手できると思います。ご使用のコンパイラ バージョンの「言語リファレンス」および「プログラミング ガイド」を検索してください (すべてのコンパイル リストのトップ ページ)。

個々のレコードを見つけるには KEY を使用した READ が必要です。または、レコードのグループがある場合は、キー/START および READ NEXT を使用して READ を使用することもできます。部分的なキーしかない場合は、START と READ NEXT を使用します。これはすでにブライアンによって提案されています。

COBOLを学んでいますか?GO TO を回避し、プログラムを別の方法でフォーマットするように努力する必要があります。1 行に動詞を 1 つだけにすることで、ピリオド/ピリオドをさらに減らすことができます (Brian の最後の「ピリオドのみ」の行の例を参照してください)。これは、段落/SECTIONS と PROCEDURE DIVISION ステートメント自体の後を除いて、必要な最も完全な停止であり、段落/SECTIONS がない場合はプログラムを終了します。

Brian のコードから真似してはいけないことが 1 つあります。それは「環境」に関するものです。メインフレームでは、ファイルを開く前または閉じた後にレコード領域にアクセスすると、S0C4 異常終了が発生します (直接または AWO コンパイル オプションを介して、APPLY WRITE ONLY を持つ QSAM ファイルでない限り)。

読み取り前にレコード領域を初期値に設定する必要はありません。

于 2013-03-03T06:51:42.607 に答える