CALL "C$SOCKET" USING CSOCKET-WRITE                        socketHandle                        buffer                        length                 GIVING returnCode  | 
CSOCKET-WRITE  | Constant  | |
socketHandle  | USAGE HANDLE  | Identifies the socket in which data will be written.  | 
buffer  | PIC X(n)   | Data to write into socket.  | 
length  | PIC 9(n)  | Optional. Number of bytes to write. A length of zero causes the entire buffer to be written into the socket.  | 
<0  | Operation failed.  | 
>0   | Number of written bytes.  |