WBITMAP-LOAD
The WBITMAP-LOAD function loads an image into memory.
Syntax:
 CALL "W$BITMAP" USING WBITMAP-LOAD
                       name
                GIVING bitmapHandle
Parameters:
WBITMAP-LOAD
Constant
 
name
PIC X(n)
Specifies the name of a regular disk file containing the image to be loaded.
Return code:
bitmapHandle must be declared as PIC S9(9) COMP-4 and provides additional information:
> 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