CALL "C$XML" USING CXML-WRITE-STRING                     handle                     dataArea              GIVING returnCode  | 
CXML-WRITE-STRING  | Constant  | |
handle  | USAGE HANDLE  | A XML parser handle.   | 
dataArea  | PIC X(n)  | Receives the XML content.  | 
0  | Operation successful.  | 
>0  | Data truncated. dataArea wasn’t large enough. The value of returnCode is the number of bytes discarded.  | 
<0  | Operation failed.  |