summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/import2.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc/testsuite/gfortran.dg/import2.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/import2.f9034
1 files changed, 0 insertions, 34 deletions
diff --git a/gcc/testsuite/gfortran.dg/import2.f90 b/gcc/testsuite/gfortran.dg/import2.f90
index 9db21977daa..76c87d617dd 100644
--- a/gcc/testsuite/gfortran.dg/import2.f90
+++ b/gcc/testsuite/gfortran.dg/import2.f90
@@ -4,30 +4,6 @@
! Test whether import does not work with -std=f95
! PR fortran/29601
-subroutine test(x)
- type myType3
- sequence
- integer :: i
- end type myType3
- type(myType3) :: x
- if(x%i /= 7) call abort()
- x%i = 1
-end subroutine test
-
-
-subroutine bar(x,y)
- type myType
- sequence
- integer :: i
- end type myType
- type(myType) :: x
- integer(8) :: y
- if(y /= 8) call abort()
- if(x%i /= 2) call abort()
- x%i = 5
- y = 42
-end subroutine bar
-
module testmod
implicit none
integer, parameter :: kind = 8
@@ -66,14 +42,4 @@ program foo
end subroutine test
end interface
- type(myType) :: y
- type(myType3) :: z
- integer(dp) :: i8
- y%i = 2
- i8 = 8
- call bar(y,i8) ! { dg-error "Type mismatch in argument" }
- if(y%i /= 5 .or. i8/= 42) call abort()
- z%i = 7
- call test(z) ! { dg-error "Type mismatch in argument" }
- if(z%i /= 1) call abort()
end program foo