Type | Visibility | Attributes | Name | Initial | |||
---|---|---|---|---|---|---|---|
class(JacobianComputer_t), | public, | allocatable | :: | Jacobian | |||
logical, | public | :: | converged | = | .FALSE. | ||
logical, | public | :: | withMPI | = | .FALSE. | ||
integer, | public | :: | DimPrb | ||||
integer, | public | :: | globalDimPrb | ||||
integer, | public | :: | niter | = | 0 | ||
integer, | public | :: | JacobianComputation | = | NUMERICAL_JACOBIAN | ||
type(DGSem), | public, | pointer | :: | p_sem | => | null() | |
type(csrMat_t), | public | :: | A | ||||
type(csrMat_t), | public, | pointer | :: | ALU | |||
type(PETSCMatrix_t), | public | :: | PETScA | ||||
real(kind=RP), | public, | DIMENSION(:), ALLOCATABLE | :: | x | |||
real(kind=RP), | public, | DIMENSION(:), ALLOCATABLE | :: | b | |||
real(kind=RP), | public | :: | Ashift | ||||
logical, | public | :: | AIsPrealloc | ||||
logical, | public | :: | Variable_dt | ||||
logical, | public | :: | AIsPetsc | = | .false. | ||
integer, | public | :: | mtype | ||||
integer, | public, | ALLOCATABLE | :: | perm(:) | |||
integer, | public, | POINTER | :: | Pardiso_iparm(:) | => | NULL() | |
integer(kind=AddrInt), | public, | POINTER | :: | Pardiso_pt(:) | => | NULL() |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(GenericLinSolver_t), | intent(inout) | :: | this | |||
integer, | intent(in) | :: | nvalues | |||
integer, | intent(in), | DIMENSION(:) | :: | irow | ||
real(kind=RP), | intent(in), | DIMENSION(:) | :: | values |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(GenericLinSolver_t), | intent(inout) | :: | this |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(GenericLinSolver_t), | intent(in) | :: | this |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout), | TARGET | :: | this | ||
integer, | intent(in) | :: | DimPrb | |||
integer, | intent(in) | :: | globalDimPrb | |||
integer, | intent(in) | :: | nEqn | |||
type(FTValueDictionary), | intent(in), | optional | :: | controlVariables | ||
type(DGSem), | optional, | TARGET | :: | sem | ||
procedure(MatrixShift_FCN) | :: | MatrixShiftFunc |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | self | |||
integer, | intent(in) | :: | nEqn | |||
integer, | intent(in) | :: | nGradEqn | |||
procedure(ComputeTimeDerivative_f) | :: | F_J | ||||
real(kind=RP), | intent(in) | :: | dt | |||
real(kind=RP), | intent(in) | :: | eps | |||
integer, | intent(in) | :: | mode_in |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | self |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout), | target | :: | this | ||
integer, | intent(in) | :: | nEqn | |||
integer, | intent(in) | :: | nGradEqn | |||
procedure(ComputeTimeDerivative_f) | :: | ComputeTimeDerivative | ||||
real(kind=RP), | optional | :: | tol | |||
integer, | optional | :: | maxiter | |||
real(kind=RP), | optional | :: | time | |||
real(kind=RP), | optional | :: | dt | |||
logical, | intent(inout), | optional | :: | ComputeA |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | self | |||
integer, | intent(out), | optional | :: | error_out |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
integer, | intent(in) | :: | irow | |||
real(kind=RP), | intent(in) | :: | value |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
real(kind=RP), | intent(in) | :: | RHS(this%DimPrb) |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
integer, | intent(in) | :: | irow | |||
real(kind=RP), | intent(out) | :: | x_i |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
real(kind=RP), | intent(in) | :: | dt |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
real(kind=RP), | intent(in) | :: | dt |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
real(kind=RP), | intent(in) | :: | dt | |||
real(kind=RP), | intent(in) | :: | time | |||
integer, | intent(in) | :: | nEqn | |||
integer, | intent(in) | :: | nGradEqn | |||
procedure(ComputeTimeDerivative_f) | :: | ComputeTimeDerivative |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | self |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
class(Matrix_t), | intent(in) | :: | Matrix |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this | |||
character(len=*) | :: | TypeOfNorm |
Type | Intent | Optional | Attributes | Name | ||
---|---|---|---|---|---|---|
class(MKLPardisoSolver_t), | intent(inout) | :: | this |