[AArch64] Merge stores of D-register values with different modes
[official-gcc.git] / gcc / testsuite / gfortran.dg / array_constructor_type_15.f03
bloba94655562e95cdcf730fa6557fd5bc050446952b
1 ! { dg-do compile }
2 ! PR fortran/27997
4 ! Array constructor with typespec
5 ! for derived types, failing conversion.
7 PROGRAM test
8   IMPLICIT NONE
10   TYPE foo
11     INTEGER :: i
12     REAL :: x
13   END TYPE foo
15   TYPE bar
16     LOGICAL :: logos
17   END TYPE bar
19   TYPE(foo), PARAMETER :: x = foo(42, 42.)
21   WRITE (*,*) (/ foo :: x, foo(0, 1.), bar(.TRUE.) /) ! { dg-error "convert TYPE" }
22 END PROGRAM test