CALL "C$XML" USING CXML-ADD-CHILD                     handle                     elemName                    [elemData]                    [dataLength]              GIVING childHandle  | 
CXML-ADD-CHILD  | Constant  | |
handle  | USAGE HANDLE  | A XML element handle.  | 
elemName  | PIC X(n)  | Specifies the name of the child element that you’re going to add.  | 
elemData  | PIC X(n)  | Specifies the value of the new child element. If omitted, blank is used.  | 
attrLength  | PIC 9(n)  | Specifies the length of the element value. If omitted, it defaults to the length of elemData.  |