CALL "A$CURRENT_USER" USING ID userName userAddr userComp threadID prog [type] |
ID | PIC X(n) | Returns the user ID. A value of zero means that the user is administrator. A value of -1 means that no login has been made. |
userName | PIC X(n) | Returns the login user name. If no login has been made, it’s set to operating system user name |
userAddr | PIC X(n) | Returns the login IP address[*] |
userComp | PIC X(n) | Returns the login computer name[*]. If the computer name can’t be retrieved, the IP address is returned in this field. |
threadID | PIC 9(n) | Returns the thread ID |
prog | PIC X(n) | Returns the name of the program launched by the client. The special value "Server Call Session" identifies a remote call. The text between square brackets tells the name of the program that was remotely called. See Remote objects for details. |
type | PIC 9(1) | Optional parameter. Returns the client type. The value is the sum between one or more of these values: 0 - standard isCOBOL Client 1 - webClient 2 - client running in a separate process due to the iscobol.as.multitasking setting |
*> All parameters are to return information from the routine *> In working-storage define thread-id as pic 9(n), all others as pic x(n) call "a$current-user" using usr-id usr-name usr-ip-addr usr-pc-name thread-id usr-program |