OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [derived_comp_array_ref_3.f90] - Blame information for rev 720

Go to most recent revision | Details | Compare with Previous | View Log

Line No. Rev Author Line
1 694 jeremybenn
! { 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 
7
!
8
MODULE 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))/))
18
CONTAINS
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
24
END MODULE cdf_nc_chisq_mod
25
 
26
  use cdf_nc_chisq_mod
27
  call local_cum_nc_chisq
28
end
29
! { dg-final { cleanup-modules "cdf_nc_chisq_mod" } }

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.