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