CALL "ESQL$BLOB" USING PUT-BLOB-INTO-FILE                         blobHandle                          fileName                  GIVING returnCode  | 
PUT-BLOB-INTO-FILE  | Constant  | |
blobHandle  | USAGE HANDLE  | It's the handle that identifies the BLOB to be written.  | 
fileName  | PIC X(n)  | It's the name of the disc file that will host the BLOB data.  |