LISTDIR-NEXT
The LISTDIR-NEXT function retrieves the next file in a list.
Syntax:
 CALL "C$LIST_DIRECTORY" USING LISTDIR-NEXT 
                               listdirHandle 
                               fileName
                              [LISTDIR-FILE-INFORMATION]
Parameters:
LISTDIR-NEXT
Constant
 
listdirHandle
USAGE HANDLE
Specifies the handle to a file list, returned by the LISTDIR-OPEN function
fileName
PIC X(n)
Receives the name of the next file in the list. When no more files are available, fileName is set to spaces.
LISTDIR-FILE-INFORMATION
Group Item
Receives the file information. This group item, defined in iscobol.def, has the following structure:
 
01  listdir-file-information.
    03 listdir-file-type       pic x.
       88  listdir-file-type-directory     value "D".
       88  listdir-file-type-regular-file  value "F".
       88  listdir-file-type-unknown       value "U".
    03 listdir-file-creation-time.
       05 ldfc-year            pic xx comp-x.
       05 ldfc-month           pic x comp-x.
       05 ldfc-day             pic x comp-x.
       05 ldfc-hour            pic x comp-x.
       05 ldfc-minute          pic x comp-x.
       05 ldfc-second          pic x comp-x.
       05 ldfc-hundreths       pic x comp-x.
    03 listdir-file-last-access-time.
       05 ldfla-year           pic xx comp-x.
       05 ldfla-month          pic x comp-x.
       05 ldfla-day            pic x comp-x.
       05 ldfla-hour           pic x comp-x.
       05 ldfla-minute         pic x comp-x.
       05 ldfla-second         pic x comp-x.
       05 ldfla-hundreths      pic x comp-x.
    03 listdir-file-last-modification-time.
       05 ldflm-year           pic xx comp-x.
       05 ldflm-month          pic x comp-x.
       05 ldflm-day            pic x comp-x.
       05 ldflm-hour           pic x comp-x.
       05 ldflm-minute         pic x comp-x.
       05 ldflm-second         pic x comp-x.
       05 ldflm-hundreths      pic x comp-x.
    03 listdir-file-size       pic x(8comp-x.
 
 
listdir-file-type
File type. It can be one of the following values:
 
"B" Block device
"C" Character device
"D" Directory
"F" Standard file
"P" Pipe
"S" Socket
"U" Unknown
 
listdir-file-creation-time
This information is not returned. Fields are reserved for future use.
 
listdir-file-last-access-time
This information is not returned. Fields are reserved for future use.
 
listdir-file-last-modification-time
File last modification time
 
listdir-file-size
File size