CALL "M$GET" USING memAddress                     dataItem                     [dataSize]                    [dataOffset]  | 
memAddress   | USAGE HANDLE   | Specifies the handle to the source memory region. Note - for compatibility reasons this item may also be defined as USAGE POINTER. In this case the program must be compiled either with -ca or -cp options. With -ca POINTER is translated to HANDLE. With -cp POINTER is a real pointer that can be shared with external C routines.  | 
dataItem   | PIC X(n)  | Receives the content of memory region pointed by memAddress.  | 
dataSize   | any numeric data item or numeric literal  | Specifies the number of bytes to be moved to dataItem. If this parameter is omitted, all the allocated memory is moved to dataItem.  | 
dataOffset  | any numeric data item or numeric literal  | Specifies the memory offset from which the data will be copied. The default value is 1.  | 
*> define mem1 usage handle *> define str1 as pic x(8) call "m$alloc" using 8, mem1 call "m$put" using mem1, "Hello", 8, 1 call "m$get" using mem1, str1, 8, 1  |