CALL "W$BITMAP" USING WBITMAP-LOAD name GIVING bitmapHandle |
WBITMAP-LOAD | Constant | |
name | PIC X(n) | Specifies the name of a regular disk file containing the image to be loaded. |
> 0 | Receives the handle to the bitmap |
-1 | Error: file not found or not readable |
-2 | Error: out of memory loading the bitmap |
-3 | Error: not a valid bitmap |
-4 | Error: format not supported |