- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Report Inappropriate Content
I'm getting the following error when I compile withVisual Fortran Compiler Version 11:
Error1 error #6633: The type of the actual argument differs from the type of the dummy argument. [WSAVE]C:\Users\mudaliars\Desktop\GratingSrcDsw\dftPack\zfftb.f7
The subroutines that this points to are given below:
SUBROUTINE
CFFTB1 (N,C,CH,WA,IFAC)
IMPLICIT DOUBLE PRECISION (A-H,O-Z)
DIMENSION CH(*) ,C(*) ,WA(*) ,IFAC(*)
NF = IFAC(2)
NA = 0
L1 = 1
IW = 1
DO 116 K1=1,NF
IP = IFAC(K1+2)
L2 = IP*L1
IDO = N/L2
IDOT = IDO+IDO
IDL1 = IDOT*L1
IF (IP .NE. 4) GO TO 103
IX2 = IW+IDOT
IX3 = IX2+IDOT
IF (NA .NE. 0) GO TO 101
CALL PASSB4 (IDOT,L1,C,CH,WA(IW),WA(IX2),WA(IX3))
GO TO 102
101
CALL PASSB4 (IDOT,L1,CH,C,WA(IW),WA(IX2),WA(IX3))
102
NA = 1-NA
GO TO 115
103
IF (IP .NE. 2) GO TO 106
IF (NA .NE. 0) GO TO 104
CALL PASSB2 (IDOT,L1,C,CH,WA(IW))
GO TO 105
104
CALL PASSB2 (IDOT,L1,CH,C,WA(IW))
105
NA = 1-NA
GO TO 115
106
IF (IP .NE. 3) GO TO 109
IX2 = IW+IDOT
IF (NA .NE. 0) GO TO 107
CALL PASSB3 (IDOT,L1,C,CH,WA(IW),WA(IX2))
GO TO 108
107
CALL PASSB3 (IDOT,L1,CH,C,WA(IW),WA(IX2))
108
NA = 1-NA
GO TO 115
109
IF (IP .NE. 5) GO TO 112
IX2 = IW+IDOT
IX3 = IX2+IDOT
IX4 = IX3+IDOT
IF (NA .NE. 0) GO TO 110
CALL PASSB5 (IDOT,L1,C,CH,WA(IW),WA(IX2),WA(IX3),WA(IX4))
GO TO 111
110
CALL PASSB5 (IDOT,L1,CH,C,WA(IW),WA(IX2),WA(IX3),WA(IX4))
111
NA = 1-NA
GO TO 115
112
IF (NA .NE. 0) GO TO 113
CALL PASSB (NAC,IDOT,IP,L1,IDL1,C,C,C,CH,CH,WA(IW))
GO TO 114
113
CALL PASSB (NAC,IDOT,IP,L1,IDL1,CH,CH,CH,C,C,WA(IW))
114
IF (NAC .NE. 0) NA = 1-NA
115
L1 = L2
IW = IW+(IP-1)*IDOT
116
CONTINUE
IF (NA .EQ. 0) RETURN
N2 = N+N
DO 117 I=1,N2
C(I) = CH(I)
117
CONTINUE
RETURN
END
SUBROUTINE
ZFFTB (N,C,WSAVE)
IMPLICIT DOUBLE PRECISION(A-H,O-Z)
DIMENSIONC(1) ,WSAVE(1)
IF (N .EQ. 1)RETURN
IW1 = N+N+1
IW2 = IW1+N+N
CALLCFFTB1 (N,C,WSAVE,WSAVE(IW1),WSAVE(IW2))
RETURN
END
Please let me know if you have suggestions.
Thanks
Praba
Link Copied
- Mark as New
- Bookmark
- Subscribe
- Mute
- Subscribe to RSS Feed
- Permalink
- Report Inappropriate Content
I'm getting the following error when I compile withVisual Fortran Compiler Version 11:
Error1 error #6633: The type of the actual argument differs from the type of the dummy argument. [WSAVE]C:UsersmudaliarsDesktopGratingSrcDswdftPackzfftb.f7
SUBROUTINE CFFTB1 (N,C,CH,WA,IFAC)
IMPLICIT DOUBLE PRECISION (A-H,O-Z)
SUBROUTINEZFFTB (N,C,WSAVE)
IMPLICIT DOUBLE PRECISION (A-H,O-Z)
CALL CFFTB1 (N,C,WSAVE,WSAVE(IW1),WSAVE(IW2))OK.
Hint :in subroutine CFFTB1 what is the type of the 5th dummy argument (IFAC))?
in theCALL to CFFTB1 what is the type of the 5th actual argument (WSAVE)?
They don't match.
Les

- Subscribe to RSS Feed
- Mark Topic as New
- Mark Topic as Read
- Float this Topic for Current User
- Bookmark
- Subscribe
- Printer Friendly Page