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.
6 ! Contributed by Michael Richmond <michael.a.richmond@nasa.gov>
8 MODULE cdf_nc_chisq_mod
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))/))
19 SUBROUTINE local_cum_nc_chisq()
21 df0
= the_chi_square
%parameters(1)%high_bound
23 END SUBROUTINE local_cum_nc_chisq
24 END MODULE cdf_nc_chisq_mod
27 call local_cum_nc_chisq