CALL "HEX2ASCII" USING asciiValue                         hexValue  | 
asciiValue  | PIC X(n)   | Receives the converted ASCII string.  | 
hexValue  | PIC X(n)  It should be twice the size of asciiValue  | Specifies the hexadecimal number to be converted.  | 
*> define ascii-value and hex-value as pic x(n) and *> hex-value should be double the lenght of ascii-value move "a1" to hex-value call "hex2ascii" using ascii-value, hex-value *> ascii-value will contain "i"  |