OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [private_type_11.f90] - Blame information for rev 694

Details | Compare with Previous | View Log

Line No. Rev Author Line
1 694 jeremybenn
! { dg-do compile }
2
! { dg-options "-std=f2003" }
3
! PR fortran/38065
4
!
5
! Reported by Norman S. Clerman
6
! and reduced by Joost VandeVondele
7
!
8
MODULE M1
9
  IMPLICIT NONE
10
  PRIVATE
11
  TYPE T1
12
   INTEGER :: I1
13
  END TYPE T1
14
  PUBLIC :: S1,F2
15
CONTAINS
16
  SUBROUTINE S1
17
  CONTAINS
18
   TYPE(T1) FUNCTION F1()
19
   END FUNCTION F1
20
  END SUBROUTINE S1
21
  TYPE(T1) FUNCTION F2()
22
  END FUNCTION F2
23
END MODULE M1
24
! { 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.