CALL "CBL_READ_KBD_CHAR" USING char GIVING returnCode |
char | PIC X(1) | Receives the character that was typed, in ASCII. |
0 | Operation successful. |
>0 | Error status. |
working-storage section. ... 01 char-typed pic x. ... procedure division. ... call "cbl_read_kbd_char" using char-typed. |