row_by_column Function

public pure function row_by_column(u, v) result(res)

Arguments

Type IntentOptional Attributes Name
double precision, intent(in), DIMENSION(:) :: u

Row

double precision, intent(in), DIMENSION(:) :: v

Column

Return Value double precision


Called by

proc~~row_by_column~~CalledByGraph proc~row_by_column row_by_column proc~apply_to_vector apply_to_vector proc~apply_to_vector->proc~row_by_column proc~square_matrix_multiplication square_matrix_multiplication proc~square_matrix_multiplication->proc~row_by_column interface~apply_to_vector apply_to_vector interface~apply_to_vector->proc~apply_to_vector proc~apply_as_congruence_to_tensor apply_as_congruence_to_tensor proc~apply_as_congruence_to_tensor->proc~square_matrix_multiplication proc~apply_as_similarity_to_tensor apply_as_similarity_to_tensor proc~apply_as_similarity_to_tensor->proc~square_matrix_multiplication proc~compute_rotation_matrices compute_rotation_matrices proc~compute_rotation_matrices->proc~square_matrix_multiplication proc~construct_boost construct_boost proc~construct_boost->proc~square_matrix_multiplication proc~construct_rotation construct_rotation proc~construct_rotation->proc~square_matrix_multiplication interface~apply_as_congruence_to_tensor apply_as_congruence_to_tensor interface~apply_as_congruence_to_tensor->proc~apply_as_congruence_to_tensor interface~apply_as_similarity_to_tensor apply_as_similarity_to_tensor interface~apply_as_similarity_to_tensor->proc~apply_as_similarity_to_tensor interface~compute_rotation_matrices compute_rotation_matrices interface~compute_rotation_matrices->proc~compute_rotation_matrices

Contents

Source Code


Variables

Type Visibility Attributes Name Initial
integer, public :: i
integer, public :: n

Source Code

  PURE FUNCTION row_by_column( u, v ) RESULT( res )

    IMPLICIT NONE

    DOUBLE PRECISION, DIMENSION(:), INTENT(IN):: u
    !! Row
    DOUBLE PRECISION, DIMENSION(:), INTENT(IN):: v
    !! Column
    DOUBLE PRECISION:: res

    INTEGER:: i, n

    n= SIZE(u)

    res= 0.D0
    DO i= 1, n, 1
      res= res + u(i)*v(i)
    ENDDO

  END FUNCTION row_by_column