WBITMAP-LOAD-FROM-CLIENT
The WBITMAP-LOAD-FROM-CLIENT function loads an image into memory. In a thin client environment, the bitmap is searched on the client side. In the other environments, calling this function is the same as calling WBITMAP-LOAD.
The loaded bitmap can be used on the GUI and on client-side print jobs, but not on server-side print jobs (see
WINPRINT-SET-PRINTER-AS for more information about client-side and server-side print jobs).
Syntax:
CALL "W$BITMAP" USING WBITMAP-LOAD-FROM-CLIENT name GIVING bitmapHandle |
Parameters:
WBITMAP-LOAD-FROM-CLIENT | 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 |