RISC-V: Regenerate opt urls.
[official-gcc.git] / gcc / testsuite / gfortran.dg / multiple_allocation_2.f90
blob617405be110e0e640d6b831a86443a2225c85fc0
1 ! { dg-do run }
2 ! PR 27470: This used fail because of confusion between
3 ! mol (allocatable) and mol(1)%array(:) (pointer).
4 ! Derived from a test case by FX Coudert.
5 PROGRAM MAIN
6 TYPE foo
7 INTEGER, DIMENSION(:), POINTER :: array
8 END TYPE foo
10 type(foo),allocatable,dimension(:) :: mol
12 ALLOCATE (mol(1))
13 ALLOCATE (mol(1)%array(5))
14 ALLOCATE (mol(1)%array(5))
16 END