isCOBOL Evolve : Appendices : Library Routines : P$ : P$SETDOCUMENTNAME
P$SETDOCUMENTNAME
The P$SETDOCUMENTNAME sets the name of the print job.
Syntax
 CALL "P$SETDOCUMENTNAME" USING documentName
                               [destination]
Parameters
documentName
PIC X(n)
Specifies the job name.
destination
PIC X(n)
Optional. Specifies the job output.
Possible value are:
"Pdf" -> the document is saved as a PDF file
"View" -> the document is shown as print preview
"Spool" -> the document is sent to the system Spooler