CALL "A$LIST_LOCKS" USING LISTLOCK-OPEN                            NULL                            fileName                            threadID                     GIVING listHandle  | 
LISTLOCK-OPEN  | Constant  | |
NULL  | Constant value  | This parameter must be Null  | 
fileName  | PIC X(n)  | Name of the file you want to inquire. If omitted or set to spaces, then all the files are inquired.  | 
threadID  | PIC 9(n)  | Thread ID of the client you want to inquire. If omitted or set to 0, then all clients are inquired.  |