OpenCores
URL https://opencores.org/ocsvn/openrisc_2011-10-31/openrisc_2011-10-31/trunk

Subversion Repositories openrisc_2011-10-31

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [interface_11.f90] - Blame information for rev 437

Go to most recent revision | Details | Compare with Previous | View Log

Line No. Rev Author Line
1 302 jeremybenn
! { dg-do compile }
2
! Tests the fix for PR30883 in which interface functions and
3
! their results did not get an implicit type.
4
!
5
! Contributed by Joost VandeVondele 
6
!
7
MODULE M1
8
  IMPLICIT NONE
9
CONTAINS
10
  SUBROUTINE S1(F1, F2, G1, G2)
11
    INTERFACE
12
      FUNCTION F1(i, a)
13
      END FUNCTION F1
14
      FUNCTION F2(i, a)
15
        implicit complex (a-z)
16
      END FUNCTION F2
17
    END INTERFACE
18
    INTERFACE
19
      FUNCTION g1(i, a) result(z)
20
      END FUNCTION g1
21
      FUNCTION g2(i, a) result(z)
22
        implicit complex (a-z)
23
      END FUNCTION g2
24
    END INTERFACE
25
  END SUBROUTINE S1
26
END MODULE
27
 
28
END
29
! { dg-final { cleanup-modules "m1" } }

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.