C$VERSION
The C$VERSION retrieves the isCOBOL framework version.
Syntax:
 CALL "C$VERSION" USING version
Parameters:
version
PIC X(n)
After this routine has been called this data item contains the isCOBOL version framework.
The same result is reachable through the following statement:
ACCEPT version FROM ENVIRONMENT "runtime.version"
Examples:
Example - Get the isCOBOL runtime version
*> define str1 as pic x(n)
 
call "c$version" using str1
*> the value of str1 will be like: isCOBOL release 2019 R1 build#977.10-20190516-27629