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