isCOBOL Evolve : Appendices : Library Routines : W$BITMAP : WBITMAP-LOAD-SYMBOL-FONT
WBITMAP-LOAD-SYMBOL-FONT
The WBITMAP-LOAD-SYMBOL-FONT function generates a bitmap strip from a text string using a given font.
This is particularly useful to generate icons from symbol fonts like Font Awesome.
Note - the feature is certified for Java 1.8.0_251 or higher. Previous Java versions may generate a bitmap smaller than the requested width.
Syntax:
 CALL "W$BITMAP" USING WBITMAP-LOAD-SYMBOL-FONT
                       fontHandle
                       charactersSequence
                       imageWidth
                      [color]
                GIVING bitmapHandle
Parameters:
WBITMAP-LOAD-SYMBOL-FONT
Constant
 
fontHandle
HANDLE OF FONT
An handle of font as returned by the W$FONT routine or one of the internal fonts available in the runtime (e.g. SMALL-FONT).
charactersSequence
Any data item or literal
Specifies the list of characters that will be included in the bitmap strip. Use a national data item or literal if the font requires Unicode representation of the characters.
imageWidth
PIC 9(n)
Specifies the width in pixels of the bitmap frame. The function generates a frame for each character in the characters sequence and then combines all the frames into a bitmap strip. Regardless of the font size, characters will be resized to fit the width specified by this parameter.
color
PIC S9(9)
Specifies the color of the characters. A negative value is treated as RGB color while a positive value is treated as COBOL color. See Color management for more information.
 
This parameter is optional; if omitted, then the black color is used.
Return code:
bitmapHandle must be declared as PIC S9(9) COMP-4 and provides additional information:
> 0
Receives the handle to the bitmap
0
An error occurred, probably the font handle is invalid