1! { dg-do run }
2! Fixed by the patch for PRs 60357 and 61275
3!
4! Contributed by Stefan Mauerberger  <stefan.mauerberger@gmail.com>
5!
6PROGRAM main
7  IMPLICIT NONE
8  TYPE :: test_typ
9    REAL, ALLOCATABLE :: a
10  END TYPE
11  TYPE(test_typ) :: my_test_typ
12  my_test_typ = test_typ (a = 1.0)
13  if (abs (my_test_typ%a - 1.0) .gt. 1e-6) call abort
14END PROGRAM main
15