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