external_ex.f90 Source File

This File Depends On

sourcefile~~external_ex.f90~~EfferentGraph sourcefile~external_ex.f90 external_ex.f90 sourcefile~square.f90 square.f90 sourcefile~square.f90->sourcefile~external_ex.f90
Help

Files Dependent On This One

sourcefile~~external_ex.f90~~AfferentGraph sourcefile~external_ex.f90 external_ex.f90 sourcefile~main_ex.f90 main_ex.f90 sourcefile~external_ex.f90->sourcefile~main_ex.f90
Help

Source Code


Source Code

module external_ex
  use iso_fortran_env, only: wp=>real64
  use square, only: squareFun
  implicit none

contains

  subroutine squareWrapperExternal(x, y)
    real(wp), intent(in),   dimension(:)  :: x
    real(wp), intent(out),  dimension(:)  :: y

    y = squareFun(x)

    return
  end subroutine squareWrapperExternal

end module external_ex