CALL "ESQL$BLOB" USING GET-BLOB-FROM-FILE                         blobHandle                         fileName                  GIVING returnCode  | 
GET-BLOB-FROM-FILE  | Constant  | |
blobHandle  | USAGE HANDLE  | It's the handle in which the reference to the BLOB will be stored.  | 
fileName  | PIC X(n)  | It's the name of the file that has to be stored as BLOB data in the database table.  |