21 REAL(KIND=8),
DIMENSION(5,5) :: A,B,sqB
22 LOGICAL :: mult,Q1fill
23 REAL(KIND=8),
DIMENSION(:),
ALLOCATABLE :: y
76 print*,
'Q1fill',q1fill
integer ndim
Number of variables (dimension of the model)
The MTV tensors used to integrate the MTV model.
subroutine, public init_sigma(mult, Q1fill)
Subroutine to initialize the sigma matices.
subroutine, public init_random_seed()
Random generator initialization routine.
subroutine, public sqrtm(A, sqA, info, info_triu, bs)
Routine to compute a real square-root of a matrix.
subroutine, public printmat(A)
The equation tensor for the coupled ocean-atmosphere model with temperature which allows for an exten...
The MTV noise sigma matrices used to integrate the MTV model.
subroutine, public compute_mult_sigma(y)
Routine to actualize the matrix based on the state y of the MTV system.
real(kind=8), dimension(:,:), allocatable, public sig1
state-dependent noise matrix
program test_sigma
Small program to test the MTV noise sigma matrices.
subroutine, public init_mtv_int_tensor
Subroutine to initialise the MTV tensor.
subroutine, public init_sqrt
The model parameters module.
real(kind=8), dimension(:,:), allocatable, public sig2
state-independent noise matrix
Utility module with various routine to compute matrix square root.
subroutine, public init_aotensor
Subroutine to initialise the aotensor tensor.