[to-be-committed] [RISC-V] Use Zbkb for general 64 bit constants when profitable
[official-gcc.git] / gcc / testsuite / gfortran.dg / structure_constructor_3.f03
blob5fb7d612d0e39b96e7b58cc367fab2a3e1cda321
1 ! { dg-do compile }
2 ! Structure constructor with component naming, test that an error is emitted
3 ! if there are arguments without name after ones with name.
5 PROGRAM test
6   IMPLICIT NONE
8   ! Structure of basic data types
9   TYPE :: basics_t
10     INTEGER :: i
11     REAL :: r
12   END TYPE basics_t
14   TYPE(basics_t) :: basics
16   basics = basics_t (i=42, 1.5) ! { dg-error "Missing keyword name" }
18 END PROGRAM test