Source | Target | Result |
---|---|---|
0 | 0 | 0 |
0 | 1 | 1 |
1 | 0 | 1 |
1 | 1 | 0 |
CALL "CBL_XOR" USING source destination [length] GIVING returnCode |
source | PIC X(n) | Specifies the first operand. |
destination | PIC X(n) | Specifies the second operand and receives the result of the operation. |
length | any numeric data item or numeric literal | Specifies the number of bytes to be considered when executing the routine. When this parameter is omitted, all bytes in source are used. |
0 | Operation successful. |
1 | Operation failed. |
move "3" to char1 *> internal bit representation 00110011 move "4" to char2 *> internal bit representation 00110100 char-result call "cbl_xor" using char1 char-result if return-code = 0 display message "XOR operation between " char1 " and " char2 " is " char-result *> char-result will have internal bit representation 00000111 end-if |