CALL "C$GUICFG" USING "Printer Dialog Always=true"  | 
SET ENVIRONMENT "printer.dialog.always" to "true"  | 
 CALL "C$GUICFG" USING  setting1                         [setting2 ... settingN]                         exit-code  | 
setting1 setting2 ... settingN  | PIC X(n)   | Specifies the configuration setting.  | 
exit-code  | PIC 9(n)  | Receives the exit status: zero for success and non-zero for failure.  | 
call "c$guicfg" using "Printer Dialog Always=true"  |