foreng_numeric_matrices Module


Uses


Contents


Interfaces

public interface gauss_elim

public interface inverse

public interface lu

public interface eliminate_column

interface

  • public module function gauss_elim_sing_32(A, b) result(x)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real32), intent(in), DIMENSION(:,:):: A
    real(kind=real32), intent(in), DIMENSION(size(A,DIM=1)):: b

    Return Value real(kind=real32), DIMENSION(size(A,DIM=1))

interface

  • public module function gauss_elim_sing_64(A, b) result(x)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real64), intent(in), DIMENSION(:,:):: A
    real(kind=real64), intent(in), DIMENSION(size(A,DIM=1)):: b

    Return Value real(kind=real64), DIMENSION(size(A,DIM=1))

interface

  • public module function gauss_elim_sing_128(A, b) result(x)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real128), intent(in), DIMENSION(:,:):: A
    real(kind=real128), intent(in), DIMENSION(size(A,DIM=1)):: b

    Return Value real(kind=real128), DIMENSION(size(A,DIM=1))

interface

  • public module function gauss_elim_mult_32(A, b) result(x)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real32), intent(in), DIMENSION(:,:):: A
    real(kind=real32), intent(in), DIMENSION(:,:):: b

    Return Value real(kind=real32), DIMENSION(size(A,DIM=1), size(b,DIM=2))

interface

  • public module function gauss_elim_mult_64(A, b) result(x)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real64), intent(in), DIMENSION(:,:):: A
    real(kind=real64), intent(in), DIMENSION(:,:):: b

    Return Value real(kind=real64), DIMENSION(size(A,DIM=1), size(b,DIM=2))

interface

  • public module function gauss_elim_mult_128(A, b) result(x)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real128), intent(in), DIMENSION(:,:):: A
    real(kind=real128), intent(in), DIMENSION(:,:):: b

    Return Value real(kind=real128), DIMENSION(size(A,DIM=1), size(b,DIM=2))

interface

  • public module function gauss_elim_inverse_32(A) result(A_inv)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real32), intent(in), DIMENSION(:,:):: A

    Return Value real(kind=real32), DIMENSION(size(A, DIM=1), size(A,DIM=1))

interface

  • public module function gauss_elim_inverse_64(A) result(A_inv)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real64), intent(in), DIMENSION(:,:):: A

    Return Value real(kind=real64), DIMENSION(size(A, DIM=1), size(A,DIM=1))

interface

  • public module function gauss_elim_inverse_128(A) result(A_inv)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real128), intent(in), DIMENSION(:,:):: A

    Return Value real(kind=real128), DIMENSION(size(A, DIM=1), size(A,DIM=1))

interface

  • public subroutine eliminate_column_32(A, icol, order)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real32), intent(inout), DIMENSION(:,:):: A
    integer, intent(in) :: icol
    integer, intent(inout), DIMENSION(:):: order

interface

  • public subroutine eliminate_column_64(A, icol, order)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real64), intent(inout), DIMENSION(:,:):: A
    integer, intent(in) :: icol
    integer, intent(inout), DIMENSION(:):: order

interface

  • public subroutine eliminate_column_128(A, icol, order)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real128), intent(inout), DIMENSION(:,:):: A
    integer, intent(in) :: icol
    integer, intent(inout), DIMENSION(:):: order

interface

  • public subroutine lu_decomp_32(A, L, U)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real32), intent(in), DIMENSION(:,:):: A
    real(kind=real32), intent(out), DIMENSION(:,:), ALLOCATABLE:: L
    real(kind=real32), intent(out), DIMENSION(:,:), ALLOCATABLE:: U

interface

  • public subroutine lu_decomp_64(A, L, U)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real64), intent(in), DIMENSION(:,:):: A
    real(kind=real64), intent(out), DIMENSION(:,:), ALLOCATABLE:: L
    real(kind=real64), intent(out), DIMENSION(:,:), ALLOCATABLE:: U

interface

  • public subroutine lu_decomp_128(A, L, U)

    Arguments

    Type IntentOptional AttributesName
    real(kind=real128), intent(in), DIMENSION(:,:):: A
    real(kind=real128), intent(out), DIMENSION(:,:), ALLOCATABLE:: L
    real(kind=real128), intent(out), DIMENSION(:,:), ALLOCATABLE:: U