CBL_OR
The CBL_OR library routine compares each bit of the first operand to the corresponding bit of its second operand. If either bit is 1, the corresponding result bit is set to 1. Otherwise, the corresponding result bit is set to 0.
Source
Target
Result
0
0
0
0
1
1
1
0
1
1
1
1
Syntax:
 CALL "CBL_OR" USING source 
                     destination
                    [length]
              GIVING returnCode
Parameters:
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
Contains the number of bytes to be considered when executing the routine. When this parameter is omitted, all bytes in source are used.
Return code:
returnCode can be any numeric data item and provides additional information:
0
Operation successful.
1
Operation failed.
Examples:
Example - Get the bit level OR result between characters 3 and 4
move "3" to char1 *> internal bit representation 00110011
move "4" to char2 *> internal bit representation 00110100
            char-result 
call "cbl_or" using char1 char-result
 
if return-code = 0
   display message "OR operation between " char1 " and " char2
                   " is " char-result
*> char-result will be 7 (with internal bit representation 00110111)
end-if