CALL "C$XML" USING CXML-GET-ATTRIBUTE                     handle                      attrNum                      attrName                      attrValue                    [valueLength]  | 
CXML-GET-ATTRIBUTE  | Constant  | |
handle  | USAGE HANDLE  | A XML element handle.  | 
attrNum  | PIC 9(n)  | The attribute to get, starting at 1.  | 
itemName  | PIC X(n)  | Receives the name of the attribute.  | 
attrValue  | PIC X(n)  | Receives the value of the attribute.  | 
valueLength  | PIC 9(n)  | Optional. Receives the lenght in bytes of the attribute value.  |