1! { dg-do run }
2! Tests the fix for PR33337, which was partly associated with
3! the problem in PR31564 and, in addition, the parentheses in
4! the initialization expression for the_chi_square.
5!
6! Contributed by Michael Richmond <michael.a.richmond@nasa.gov>
7!
8MODULE cdf_nc_chisq_mod
9  PUBLIC
10  TYPE :: one_parameter
11    INTEGER :: high_bound
12  END TYPE one_parameter
13  TYPE :: the_distribution
14    TYPE (one_parameter) :: parameters(1)
15  END TYPE the_distribution
16  TYPE (the_distribution), PARAMETER :: the_chi_square = &
17    the_distribution((/(one_parameter(99))/))
18CONTAINS
19  SUBROUTINE local_cum_nc_chisq()
20    integer :: df0
21    df0 = the_chi_square%parameters(1)%high_bound
22    print *, df0
23  END SUBROUTINE local_cum_nc_chisq
24END MODULE cdf_nc_chisq_mod
25
26  use cdf_nc_chisq_mod
27  call local_cum_nc_chisq
28end
29