Fortran 的 mex 网关中 REAL 变量的可移植声明

Portable declaration of REAL variables in mex gateway for Fortran

我正在为一段 Fortran 代码编写一个 mex 网关。

在 Fortran 代码中,为了可移植性,浮点变量被声明为

REAL(kind(0.0D0)) :: x, y, etc

(顺便说一句,我知道有更好的方法可以做到这一点,正如在 Fortran: integer*4 vs integer(4) vs integer(kind=4), What does "real*8" mean?,以及 https://software.intel.com/en-us/blogs/2017/03/27/doctor-fortran-in-it-takes-all-kinds )

不过我觉得mex只支持REAL*8和REAL*4,前者是Double,后者是Single。我从以下 functions/subroutines:

得到了这个印象

mxIsDouble、mxIsSingle、mxCopyPtrToReal8、mxCopyReal8ToPtr、mxCopyPtrToReal4、mxCopyReal4ToPtr

我的问题如下

  1. 难道mex只支持REAL*8和REAL*4?

  2. 如果我将双精度浮点变量声明为

    是否会提高 mex 网关的可移植性

    真实(种类(0.0D0)):: x、y 等

甚至

integer, parameter :: dp = selected_real_kind(15, 307)
real(kind=dp) :: x, y, etc

或者我应该简单地声明

REAL*8 :: x, y, etc 
  1. 所有平台都支持 REAL*8 and/orREAL*4 吗?如果不是,这是否意味着 MATLAB mex 本质上不可移植?

  2. 在 mex 网关中为 Fortran 代码指定浮点变量种类的最佳方法是什么?

下面的代码是一个例子。请参阅 x、y 和 xs 的声明。

#include "fintrf.h"

      subroutine mexFunction(nlhs, plhs, nrhs, prhs)
C     y = square (x) 
C     x: a floating point scalar
C     y: x^2

      implicit none

C     mexFunction arguments 
      integer, intent(in) :: nlhs, nrhs 
      mwPointer, intent(in) :: prhs(nrhs)
      mwPointer, intent(inout) :: plhs(nlhs)

C     function declarations:
      mwPointer, external :: mxCreateDoubleScalar, mxGetPr
      mwSize, external :: mxGetM, mxGetN
      integer*4, external :: mxIsDouble, mxIsSingle 

C     variables
      mwSize, parameter :: mwOne = 1
      integer, parameter :: dKind = kind(0.0D0) 
      integer, parameter :: sKind = kind(0.0) 
      real(kind=dKind) :: x, y ! Does this improve the portablity?
      real(kind=sKind) :: xs ! Does this improve the portablity?

C     validate number of arguments
      if (nrhs .ne. 1) then
         call mexErrMsgIdAndTxt ('mex:nInput', '1 input required.')
      endif
      if (nlhs .gt. 1) then
         call mexErrMsgIdAndTxt ('mex:nOutput', 'At most 1 output.')
      endif

C     validate input
      if (mxIsDouble(prhs(1)) .ne. 1 .and. mxIsSingle(prhs(1)) .ne. 1) 
      ! What if the input is a floating point number but neither Double nor Single? 
     + then 
          call mexErrMsgIdAndTxt ('mex:Input', 'Input a real number.')
      endif
      if (mxGetM(prhs(1)) .ne. 1 .or. mxGetN(prhs(1)) .ne. 1) then
          call mexErrMsgIdAndTxt ('mex:Input', 'Input a scalar.')
      endif

C     read input
      if (mxIsDouble(prhs(1)) .eq. 1) then
         call mxCopyPtrToReal8(mxGetPr(prhs(1)), x, mwOne) 
      else
         call mxCopyPtrToReal4(mxGetPr(prhs(1)), xs, mwOne)
         x = real(xs, dKind) 
         ! What if the input is a floating point number but neither REAL*8 nor REAL*4
      endif

C     do the calculation
      y = x**2

C     write output
      plhs(1) = mxCreateDoubleScalar(y)

      return
      end subroutine mexFunction

代码运行正确。但是我不确定它是否便携。

REAL*4REAL*8 是非标准和不可移植的。 REAL(KIND(0.0D0) 让您在每个平台上都能 DOUBLE PRECISION,因为这是 Fortran 标准所要求的。

我无法与 MEX 网关通信,但您应该避免明显的非标准功能。

一个流行的选择是定义一个模块,为正在使用的种类声明命名(参数)常量。例如:

module kinds integer, parameter :: SP = KIND(0.0) integer, parameter :: DP = KIND(0.0D0) end module kinds

然后您可以使用 SPDP 作为种类值。如果您需要更改这些,只需编辑模块即可。

目前,无论您将变量定义为REAL*8/REAL*4还是REAL(REAL64)/REAL(REAL32)都没有区别。将来 MathWorks 可能会出现并重写它们的函数以使用可移植变量声明,但在我看来这不太可能,原因有很多。

如果您查看 fintrf.h 文件(包含在每个 Fortran MEX 网关源文件中),您会看到所有 MEX-specific 过程都是用 "asterisk notation," 定义的,例如# define MWPOINTER INTEGER*8。因此,即使您使用 iso_fortran_env 或 selected_real_kind 中的种类定义所有变量,只要您使用 MathWorks 变量类型,您仍在使用 "asterisk notation" 类型,除非您通过 "asterisk notation" 类型=21=] 文件并使用您选择的种类规范重新定义每个符号。