CALL "A$SEND_MESSAGE" USING  threadID,                               msgText,                              [msgTitle]                        GIVING returnCode  | 
threadID  | PIC 9(n)   | Specifies the thread ID of the client that will receive the message  | 
msgText  | PIC X(n)   | Specifies the text of the message.  | 
msgTitle  | PIC X(n)  | Optional parameter. Specifies the title of the message box. If omitted, the title is set to "A$SEND_MESSAGE".  | 
0   | Operation successul.  | 
-1  | Invalid arguments.  | 
-2  | Recipient client not found.  | 
-3  | Communication error.  | 
... call "A$SEND_MESSAGE" using 2, "Invoice number #1312 has been printed",                                "Message from Tom". ...  | 
 LINKAGE SECTION.  77 msgText  pic x any length.  77 msgTitle pic x any length.  | 
 program-id. "a$custom_message".  working-storage section.  77 n-win handle of window.  linkage section.  77 msgText pic x any length.  77 msgTitle pic x any length.  screen section.  01 n-screen.    03 entry-field line 1, col 1       lines 10 cells, size 40 cells       no-box, multiline, read-only, value msgText.  procedure division using msgText, msgTitle.  main.     display notification window             bottom right             lines 10, size 40             before time 500             visible 0             handle n-win.     display n-screen upon n-win.     modify n-win visible 1.  |