CALL "C$SOCKET" USING CSOCKET-CREATE-CLIENT                        portNumber                        serverName                 GIVING clientHandle  | 
CSOCKET-CREATE-CLIENT  | Constant  | |
portNumber  | PIC 9 (n)   | Numeric value specifying the port on which the socket is created.  | 
serverName  | PIC X(n)  | The machine name or ip address of the server.  | 
clientHandle  | USAGE HANDLE  | Handle of the client or zero if operation fails.  |