C$SETENV
The C$SETENV library routine sets a configuration property.
Syntax:
 CALL "C$SETENV" USING propertyName
                       propertyValue
Parameters:
propertyName
PIC X(n) or string literal.
Name of the property.
propertyValue
PIC X(n) or string literal
Value of the property.
Examples:
Example - Set the value of the file.prefix configuration property
*> define varname and varvalue as pic x(n)
 
move "file.prefix" to varname
move "c:/app1/dat1;c:/app1/dat2"
call "c$setenv" using varname varvalue