OSDN Git Service

PR debug/43329
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / structure_constructor_10.f90
1 ! { dg-do compile }
2 !
3 ! PR 41070: [4.5 Regression] Error: Components of structure constructor '' at (1) are PRIVATE
4 !
5 ! Contributed by Michael Richmond <michael.a.richmond@nasa.gov>
6
7 MODULE cdf_aux_mod
8 IMPLICIT NONE
9
10 TYPE :: one_parameter
11   CHARACTER (8) :: name
12 END TYPE one_parameter
13
14 TYPE :: the_distribution
15   CHARACTER (8) :: name
16 END TYPE the_distribution
17
18 TYPE (the_distribution), PARAMETER :: the_beta = the_distribution('cdf_beta')
19 END MODULE cdf_aux_mod
20
21 SUBROUTINE cdf_beta()
22   USE cdf_aux_mod
23   IMPLICIT NONE
24   CALL check_complements(the_beta%name)
25 END SUBROUTINE cdf_beta
26
27 ! { dg-final { cleanup-modules "cdf_aux_mod" } }
28