CALL "C$XML" USING CXML-GET-PROC-INSTR                     handle                     idx                     target                     data  | 
CXML-GET-PROC-INSTR  | Constant  | |
handle  | USAGE HANDLE  | A XML parser handle.   | 
idx  | PIC 9(n)  | Specifies the index of the processing instruction. Use 1 to get the first processing instruction, 2 to get the second, and so on.  | 
target  | PIC X(n)  | Returns the target. For example, if the following instruction is processed:  <?xml-stylesheet type="text/css" href="veryant.css"?> target will be set to: xml-stylesheet.  | 
data  | PIC X(n)  | Returns the data. For example, if the following instruction is processed: <?xml-stylesheet type="text/css" href="veryant.css"?> data will be set to:  type="text/css" href="veryant.css".   |