[AArch64] Merge stores of D-register values with different modes
[official-gcc.git] / gcc / testsuite / gfortran.dg / structure_constructor_2.f03
blob287f3c01ec8101762aae6de8fe871f6074255d3a
1 ! { dg-do run }
2 ! Structure constructor with component naming.
4 PROGRAM test
5   IMPLICIT NONE
7   ! Structure of basic data types
8   TYPE :: basics_t
9     INTEGER :: i
10     REAL :: r
11     COMPLEX :: c
12     LOGICAL :: l
13   END TYPE basics_t
15   TYPE(basics_t) :: basics
17   basics = basics_t (42, -1.5, c=(.5, .5), l=.FALSE.)
18   IF (basics%i /= 42 .OR. basics%r /= -1.5 &
19       .OR. basics%c /= (.5, .5) .OR. basics%l) THEN
20     STOP 1
21   END IF
23   basics = basics_t (r=-1.5, i=42, l=.FALSE., c=(.5, .5))
24   IF (basics%i /= 42 .OR. basics%r /= -1.5 &
25       .OR. basics%c /= (.5, .5) .OR. basics%l) THEN
26     STOP 2
27   END IF
29 END PROGRAM test