PR rtl-optimization/82913
[official-gcc.git] / gcc / testsuite / gfortran.dg / structure_constructor_10.f90
blob3231571244add391ba5b20fa88ed398db8f5fbb8
1 ! { dg-do compile }
3 ! PR 41070: [4.5 Regression] Error: Components of structure constructor '' at (1) are PRIVATE
5 ! Contributed by Michael Richmond <michael.a.richmond@nasa.gov>
7 MODULE cdf_aux_mod
8 IMPLICIT NONE
10 TYPE :: one_parameter
11 CHARACTER (8) :: name
12 END TYPE one_parameter
14 TYPE :: the_distribution
15 CHARACTER (8) :: name
16 END TYPE the_distribution
18 TYPE (the_distribution), PARAMETER :: the_beta = the_distribution('cdf_beta')
19 END MODULE cdf_aux_mod
21 SUBROUTINE cdf_beta()
22 USE cdf_aux_mod
23 IMPLICIT NONE
24 CALL check_complements(the_beta%name)
25 END SUBROUTINE cdf_beta