CALL "C$SOCKET" USING CSOCKET-CREATE-SERVER                        portNumber                 GIVING serverHandle  | 
CSOCKET-CREATE-SERVER  | Constant  | |
portNumber  | PIC 9 (n)  | Numeric value specifying the port on which the socket is created.  | 
serverHandle  | USAGE HANDLE  | Handle of the server or zero if operation fails.  |