Files
clang-p2996/flang/test/Semantics/resolve109.f90
Peter Klausler eb14135e35 [flang] Correct interaction between generics and intrinsics
Fortran allows a generic interface to have he same name as an
intrinsic procedure.  If the intrinsic is explicitly marked with
the INTRINSIC attribute, restrictions apply (C848) - the generic
must contain only functions or subroutines, depending on the
intrinsic.  Explicit or not, the generic overrides the intrinsic,
but the intrinsic behavior must still be available for calls
whose actual arguments do not match any of the specific procedures.

Semantics was not checking constraint C848, and it didn't allow
an explicit INTRINSIC attribute on a name of a generic interface.

Differential Revision: https://reviews.llvm.org/D123713
2022-04-14 13:56:04 -07:00

59 lines
1.6 KiB
Fortran

! RUN: %python %S/test_errors.py %s %flang_fc1
! Interfaces are allowed to extend intrinsic procedures, with limitations
module m1
intrinsic sin
interface sin
module procedure :: charcpy
end interface
interface cos ! no INTRINSIC statement
module procedure :: charcpy
end interface
intrinsic mvbits
interface mvbits
module procedure :: negate
end interface
interface move_alloc ! no INTRINSIC statement
module procedure :: negate
end interface
interface tan ! not explicitly INTRINSIC
module procedure :: negate ! a subroutine
end interface
interface acos
module procedure :: minus ! override
end interface
intrinsic atan
!ERROR: Generic interface 'atan' with explicit intrinsic function of the same name may not have specific procedure 'negate' that is a subroutine
interface atan
module procedure :: negate ! a subroutine
end interface
contains
character function charcpy(x)
character, intent(in) :: x
charcpy = x
end function
subroutine negate(x)
real, intent(in out) :: x
x = -x
end subroutine
real elemental function minus(x)
real, intent(in) :: x
minus = -x
end function
subroutine test
integer, allocatable :: j, k
real :: x
character :: str
x = sin(x)
str = sin(str) ! charcpy
x = cos(x)
str = cos(str) ! charcpy
call mvbits(j,0,1,k,0)
call mvbits(x) ! negate
call move_alloc(j, k)
call move_alloc(x) ! negate
!ERROR: Cannot call subroutine 'tan' like a function
x = tan(x)
x = acos(x) ! user's interface overrides intrinsic
end subroutine
end module