CALL "C$GETCGI"  USING variableName                        destItem                       [valueIndex]                 GIVING returnCode  | 
variableName   | PIC X(n) or string literal  | Name of the variable.  | 
destItem  | PIC X(n)  | Value of the variable.  | 
valueIndex  | PIC 9(n)  | Optional parameter. It contains an index that is used when a CGI variable has multiple values in the CGI input data.   |