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