CALL "C$XML" USING CXML-GET-SIBLING-BY-ATTR-NAME                     handle                     attrName                     attrFlags              GIVING siblingHandle  | 
CXML-GET-SIBLING-BY-ATTR-NAME  | Constant  | |
handle  | USAGE HANDLE  | A XML element handle.  | 
attrName  | PIC X(n)  | Specifies the attribute name to search.  | 
attrFlags  | PIC 9(n)  | Specifies if the search should consider case. Valid values are: 0 - case sensitive search 1 - case insensitive search  |