isCOBOL Evolve : Appendices : Library Routines : C$MONITOR : CMONITOR-GET-MONITOR-INFO
CMONITOR-GET-MONITOR-INFO
The CMONITOR-GET-MONITOR-INFO function returns information about a given monitor.
Syntax:
 CALL "C$MONITOR" USING CMONITOR-GET-MONITOR-INFO
                        monitorIndex
                        CMONITOR-DATA
                 GIVING returnCode
Parameters:
CMONITOR-GET-MONITOR-INFO
Constant
 
monitorIndex
PIC 9(n)
Specifies the index of the monitor to inquire.
CMONITOR-DATA
Group item
Receives the file information. This group item, defined in iscobol.def, has the following structure:
 
01 cmonitor-data.
03 cmonitor-usable-screen-height pic x(2) comp-x.
03 cmonitor-usable-screen-width pic x(2) comp-x.
03 cmonitor-physical-screen-height pic x(2) comp-x.
03 cmonitor-physical-screen-width pic x(2) comp-x.
03 cmonitor-start-y signed-int.
03 cmonitor-start-x signed-int.
 
cmonitor-usable-screen-height
Returns the usable screen height in pixels.
 
cmonitor-usable-screen-width
Returns the usable screen width in pixels.
 
cmonitor-physical-screen-height
Returns the physical screen height in pixels.
 
cmonitor-physical-screen-width
Returns the physical screen width in pixels.
 
cmonitor-start-y
Returns the coordinate of the first usable pixel on the Y axis.
 
cmonitor-start-x
Returns the coordinate of the first usable pixel on the X axis.
Return code:
returnCode can be any signed numeric data item and provides additional information:
1
Operation successful.
0
Operation not supported.
-1
Operation failed due to bad arguments.