|  CALL "C$STRING_CONVERT" USING inputString                                 outputString                                inputEncoding                                outputEncoding                         GIVING returnCode | 
| inputString | PIC X(n)  | Contains the original string encoded with the character set specified by inputEncoding. | |
| outputString | PIC X(n)  | Receives the new string encoded with the character set specified by outputEncoding. | |
| inputEncoding | PIC X(n) or string literal | Specifies the encoding of inputString. Refer to Supported Encodings in the Java documentation for the list of valid values. | |
| outputEncoding | PIC X(n) or string literal | Specifies the encoding for outputString. Refer to Supported Encodings in the Java documentation for the list of valid values. | |
| 0 | Operation successful | 
| 1 | Operation failed. An invalid encoding have been used or a conversion exception occurred. | 
| call "c$string_convert" using myvar myvar-utf8 "Cp1252" "UTF-8" |