!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! Structured Markov Chains Solver [ SMCSolver ] ! ! Dario Bini, Beatrice Meini, Sergio Steffe' ! ! bini@dm.unipi.it, meini@dm.unipi.it, steffe@dm.unipi.it ! ! Dipartimento di Matematica "Leonida Tonelli" ! ! Largo Pontecorvo 5 ! ! 56127 Pisa ! ! Italy ! ! Version 1.3 - March 2007 ! !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! ! ! ! module is_int interface SUBROUTINE is(A, method, eps, maxit, G, drift, err) integer,parameter::dp=kind(0.d0) REAL(dp), DIMENSION(:,:,:):: a REAL(dp), DIMENSION(:,:) :: g REAL(dp) :: eps,err,drift integer :: method, maxit end SUBROUTINE is end interface interface function drft_mg1(a) integer,parameter::dp=kind(0.d0) real(dp),dimension(:,:,:)::a real(dp)::drft_mg1 end function drft_mg1 end interface end module is_int