27 REAL(KIND=8),
PARAMETER ::
real_eps = 2.2204460492503131e-16
29 REAL(KIND=8),
DIMENSION(:,:),
ALLOCATABLE,
PUBLIC ::
corrint 41 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 44 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 56 REAL(KIND=8) :: s,func_ij
67 REAL(KIND=8) :: s,func_ijkl
76 INTEGER :: i,j,k,l,n,AllocStat
80 INQUIRE(file=
'corrint.def',exist=ex)
84 OPEN(30,file=
'corrint.def',status=
'old')
88 stop
"*** File corrint.def not found ! ***" 100 OPEN(30,file=
'corrint.def')
106 INQUIRE(file=
'corr2int.def',exist=ex)
112 stop
"*** File corr2int.def not found ! ***" 132 IF (allocstat /= 0) stop
"*** Not enough memory ! ***" 160 stop
'*** INT_CORR_MODE variable not properly defined in corrmod.nml ***' The stochastic models parameters module.
integer ndim
Number of variables (dimension of the model)
real(kind=8), dimension(:,:), allocatable, public corr_ij
Matrix holding the correlation matrix at a given time.
subroutine, public comp_corrint
Routine that actually compute or load the integrals.
real(kind=8) function func_ijkl(s)
Function that returns the component oi,oj,ok and ol of the outer product of the correlation matrix wi...
real(kind=8), dimension(:,:), allocatable, public corrint
Matrix holding the integral of the correlation matrix.
Utility module containing the routines to perform the integration of functions.
subroutine, public load_tensor4_from_file(s, t)
Load a rank-4 tensor coolist from a file definition.
subroutine, public init_corr
Subroutine to initialise the computation of the correlation.
character(len=4) int_corr_mode
Correlation integration mode.
type(coolist4), dimension(:), allocatable, public corr2int
Tensor holding the integral of the correlation outer product with itself.
subroutine, public init_corrint
Subroutine to initialise the integrated matrices and tensors.
subroutine, public write_tensor4_to_file(s, t)
Load a rank-4 tensor coolist from a file definition.
real(kind=8) function func_ij(s)
Function that returns the component oi and oj of the correlation matrix at time s.
integer, public n_unres
Number of unresolved variables.
4d coordinate list. Type used to represent the rank-4 sparse tensor.
real(kind=8), parameter real_eps
Small epsilon constant to determine equality with zero.
Module to initialize the correlation matrix of the unresolved variables.
integer, dimension(:), allocatable, public ind
procedure(corrcomp_from_spline), pointer, public corrcomp
Pointer to the correlation computation routine.
The model parameters module.
subroutine, public integrate(func, ss)
Routine to compute integrals of function from O to #maxint.
integer ol
Integers that specify the matrices and tensor component considered as a function of time...
Module to select the resolved-unresolved components.
Module to compute or load the integrals of the correlation matrices.