summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/host_assoc_function_7.f90
diff options
context:
space:
mode:
authorupstream source tree <ports@midipix.org>2015-03-15 20:14:05 -0400
committerupstream source tree <ports@midipix.org>2015-03-15 20:14:05 -0400
commit554fd8c5195424bdbcabf5de30fdc183aba391bd (patch)
tree976dc5ab7fddf506dadce60ae936f43f58787092 /gcc/testsuite/gfortran.dg/host_assoc_function_7.f90
downloadcbb-gcc-4.6.4-554fd8c5195424bdbcabf5de30fdc183aba391bd.tar.bz2
cbb-gcc-4.6.4-554fd8c5195424bdbcabf5de30fdc183aba391bd.tar.xz
obtained gcc-4.6.4.tar.bz2 from upstream website;upstream
verified gcc-4.6.4.tar.bz2.sig; imported gcc-4.6.4 source tree from verified upstream tarball. downloading a git-generated archive based on the 'upstream' tag should provide you with a source tree that is binary identical to the one extracted from the above tarball. if you have obtained the source via the command 'git clone', however, do note that line-endings of files in your working directory might differ from line-endings of the respective files in the upstream repository.
Diffstat (limited to 'gcc/testsuite/gfortran.dg/host_assoc_function_7.f90')
-rw-r--r--gcc/testsuite/gfortran.dg/host_assoc_function_7.f9041
1 files changed, 41 insertions, 0 deletions
diff --git a/gcc/testsuite/gfortran.dg/host_assoc_function_7.f90 b/gcc/testsuite/gfortran.dg/host_assoc_function_7.f90
new file mode 100644
index 000000000..15684438a
--- /dev/null
+++ b/gcc/testsuite/gfortran.dg/host_assoc_function_7.f90
@@ -0,0 +1,41 @@
+! { dg-do run }
+! Tests the fix for PR38907, in which any expressions, including unary plus,
+! in front of the call to S_REAL_SUM_I (marked) would throw the mechanism
+! for correcting invalid host association.
+!
+! Contributed by Dick Hendrickson <dick.hendrickson@gmail.com>
+!
+module sa0054_stuff
+ REAL :: S_REAL_SUM_2(10) = [(REAL (I), I = 1, 10)]
+contains
+ ELEMENTAL FUNCTION S_REAL_SUM_I (A)
+ REAL :: S_REAL_SUM_I
+ REAL, INTENT(IN) :: A
+ X = 1.0
+ S_REAL_SUM_I = X
+ END FUNCTION S_REAL_SUM_I
+ SUBROUTINE SA0054 (RDA)
+ REAL RDA(:)
+ RDA = + S_REAL_SUM_I (RDA) ! Reported problem => ICE
+ RDA = RDA + S_REAL_SUM_2 (INT (RDA)) ! Also failed
+ CONTAINS
+ ELEMENTAL FUNCTION S_REAL_SUM_I (A)
+ REAL :: S_REAL_SUM_I
+ REAL, INTENT(IN) :: A
+ S_REAL_SUM_I = 2.0 * A
+ END FUNCTION S_REAL_SUM_I
+ ELEMENTAL FUNCTION S_REAL_SUM_2 (A)
+ REAL :: S_REAL_SUM_2
+ INTEGER, INTENT(IN) :: A
+ S_REAL_SUM_2 = 2.0 * A
+ END FUNCTION S_REAL_SUM_2
+ END SUBROUTINE
+end module sa0054_stuff
+
+ use sa0054_stuff
+ REAL :: RDA(10) = [(REAL(I), I = 1, 10)]
+ call SA0054 (RDA)
+ IF (ANY (INT (RDA) .ne. [(6 * I, I = 1, 10)])) print *, rda
+END
+
+! { dg-final { cleanup-modules "sa0054_stuff" } }