I am new to Mathematica compilation, so I was wonderign if you can help me compile a sample DLL for MSC Adams/Solver. I have done this before in Fortran and the header reads as
 
      SUBROUTINE envelope(ID, TIME, PAR, NPAR, DFLAG, IFLAG, VALUE)
      INTEGER                     ID
      DOUBLE PRECISION            TIME
      INTEGER                     NPAR
      DOUBLE PRECISION            PAR( NPAR )      
      LOGICAL                     DFLAG
      LOGICAL                     IFLAG
      DOUBLE PRECISION            VALUE
C     Do Some Calculation
      VALUE = ONE
      RETURN
      END
What information do I need to compile my first DLL for ADAMS? Thanks !