Возникли проблемы при написании программы Cobol, которая извлекает информацию из отдельных файлов vsam
У меня есть три файла VSAM. Один для клиентов, видео и аренды. В этих файлах VSAM у каждого клиента, видео и проката есть свой идентификатор. Ниже приведен пример файла клиента:
300, Боб, 315-123-1414
301, Райан, 315-213-2617
302, Смит, 315-123-1234
303, Роберта, 212-125-1234
Видеофайл и файл проката настраиваются одинаково.
Мне нужно написать программу cobol, которая будет читать эти файлы VSAM, а затем перечислять клиентов, видео и видео, которые клиент арендовал. Я планирую сделать это, имея один идентификационный номер для каждого клиента, а затем добавив этот идентификационный номер к арендованным видео.
Код кобола, который у меня есть, находится ниже:
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.
Ниже я добавляю программу чтения, думаю, это поможет вам с надеждой помочь мне:
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.
Я застрял и не знаю, как перечислить всю информацию.
Спасибо
2 ответа
См. http://opencobol.add1tocobol.com/ для примера, чем сканирование файлов INDEXED, и, возможно, http://opencobol.add1tocobol.com/ (другой файл org)
Примечание: это только для подсказок. Посмотрите, чтобы начать и читать дальше для подсказки
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.
Хорошо, руководства IBM Cobol, я полагаю, IBM из-за VSAM, доступны онлайн. Найдите "Справочник по языку" и "Руководство по программированию" для своей версии компилятора (которая является главной страницей каждого списка компиляции).
Вам потребуется READ с КЛЮЧОМ, чтобы найти отдельную запись, или, если у вас была группа записей, вы также можете использовать READ с ключом /START и READ NEXT. Если у вас есть только частичный ключ, вы используете START и READ NEXT. Это уже было предложено Брайаном.
Вы изучаете Кобол? Вы должны приложить все усилия, чтобы избежать GO TO и по-разному форматировать вашу программу, только один глагол на строку, что также поможет вам еще больше сократить число точек / периодов (посмотрите на пример Брайана, где строка "только для полной остановки" в конце каждый абзац - это наиболее необходимые точки остановки, кроме как после абзацев /SECTIONS и самого оператора PROCEDURE DIVISION, а также для завершения программы, если у вас нет абзацев /SECTIONS.
Есть одна вещь, которую вы не должны копировать из кода Брайана, это "среда". На мэйнфрейме, если вы обращаетесь к области записи до того, как файл открыт или после его закрытия, вы получите аварийное завершение S0C4 (если только это не файл QSAM, в котором есть только APPLY WRITE, либо напрямую, либо с помощью опции компиляции AWO).
Нет необходимости устанавливать начальное значение области записи перед чтением.