CALL "A$GET-DIGEST" using digest                            param1 [,... , param(n)]  | 
digest   | PIC X(n).   | Returns the digest of the other parameters.  | 
params  | PIC X(n) or string literal.   | Specifies the items for which the digest will be retrieved.  | 
       working-storage section.        77  input-string pic x(256).        77  digest       pic x any length.        ...        procedure division.        ...            move "Veryant" to input-string.            call "A$GET_DIGEST" using digest, input-string.        ...  |