CALL "C$XML" USING CXML-GET-ATTRIBUTE-BY-NAME handle attrName attrFlags attrIdx attrActualName attrValue attrLen |
CXML-GET-ATTRIBUTE-BY-NAME | Constant | |
handle | USAGE HANDLE | A XML element handle. |
attrName | PIC X(n) | It specifies the name of the attribute 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 |
attrIdx | PIC 9(n) | On entry, it specifies the starting index of attributes to search; use zero to start at the first attribute. On exit, it returns the index of the attribute found. |
attrActualName | PIC X(n) | It returns the name of the attribute found. |
attrValue | PIC X(n) | It returns the value of the attribute found. |
attrLen | PIC 9(n) | It returns the lenght of the attribute value. |