1! { dg-do run }
2! Tests the fix for PR31564, in which the actual argument to
3! the call for set_bound was simplified when it should not be.
4!
5! Contributed by Michael Richmond <michael.a.richmond@nasa.gov>
6!
7MODULE cdf_aux_mod
8  TYPE :: the_distribution
9    INTEGER :: parameters(2)
10  END TYPE the_distribution
11  TYPE (the_distribution), PARAMETER :: the_beta = the_distribution((/99,999/))
12CONTAINS
13  SUBROUTINE set_bound(arg_name, test)
14    INTEGER, INTENT (IN) :: arg_name, test
15    if (arg_name .ne. test) STOP 1
16  END SUBROUTINE set_bound
17END MODULE cdf_aux_mod
18
19MODULE cdf_beta_mod
20CONTAINS
21  SUBROUTINE cdf_beta(which, test)
22    USE cdf_aux_mod
23    INTEGER :: which, test
24    CALL set_bound(the_beta%parameters(which), test)
25  END SUBROUTINE cdf_beta
26END MODULE cdf_beta_mod
27
28  use cdf_beta_mod
29  call cdf_beta (1, 99)
30  call cdf_beta (2, 999)
31end
32