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

Subversion Repositories openrisc

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

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

Line No. Rev Author Line
1 694 jeremybenn
! { dg-do compile }
2
! Tests the fix for PR30660 in which gfortran insisted that g_dest
3
! should have the SAVE attribute because the hidden default
4
! initializer for the allocatable component was being detected.
5
!
6
! Contributed by Toon Moene 
7
!
8
MODULE types_m
9
  TYPE coord_t
10
    INTEGER ncord
11
    REAL,ALLOCATABLE,DIMENSION(:) :: x, y
12
  END TYPE
13
 
14
  TYPE grib_t
15
    REAL,DIMENSION(:),ALLOCATABLE :: vdata
16
   TYPE(coord_t) coords
17
  END TYPE
18
END MODULE
19
 
20
MODULE globals_m
21
  USE types_m
22
  TYPE(grib_t) g_dest           ! output field
23
END MODULE
24
! { dg-final { cleanup-modules "types_m globals_m" } }
25
 

powered by: WebSVN 2.1.0

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