printmat_c Subroutine

private subroutine printmat_c(matrix, rows, cols, iunit, title, tr)

Arguments

Type IntentOptional Attributes Name
complex(kind=real_4), intent(in), DIMENSION(:) :: matrix
integer, intent(in) :: rows
integer, intent(in) :: cols
integer, intent(in) :: iunit
character(len=*), intent(in), optional :: title
logical, intent(in), optional :: tr

Source Code

   SUBROUTINE printmat_c(matrix, rows, cols, iunit, title, tr)
      COMPLEX(KIND=real_4), DIMENSION(:), INTENT(IN)     :: matrix
      INTEGER, INTENT(IN)                                :: rows, cols, iunit
      CHARACTER(*), INTENT(IN), OPTIONAL                 :: title
      LOGICAL, INTENT(IN), OPTIONAL                      :: tr

      IF (PRESENT(title)) THEN
         IF (PRESENT(tr)) THEN
            CALL printmat_s(REAL(matrix, KIND=sp), rows, cols, iunit, title, tr)
         ELSE
            CALL printmat_s(REAL(matrix, KIND=sp), rows, cols, iunit, title)
         END IF
      ELSE
         IF (PRESENT(tr)) THEN
            CALL printmat_s(REAL(matrix, KIND=sp), rows, cols, iunit, tr=tr)
         ELSE
            CALL printmat_s(REAL(matrix, KIND=sp), rows, cols, iunit)
         END IF
      END IF
   END SUBROUTINE printmat_c