[AArch64] Merge stores of D-register values with different modes
[official-gcc.git] / gcc / testsuite / gfortran.dg / pr15129.f90
blobeffaa1a838dee5b98830e5f93fcffffcb99e8825
1 ! { dg-do run }
2 ! { dg-options "-std=legacy" }
4 ! PR 15129: we used to share the character length between A and B in the
5 ! subroutine.
6 CHARACTER*10 A
7 CHARACTER*8 B
8 A = 'gfortran'
9 B = 'rocks!'
10 CALL T(A,B)
11 contains
12 SUBROUTINE T(A,B)
13 CHARACTER*(*) A,B
14 if(len(a)/=10) STOP 1
15 if(len(b)/=8) STOP 2
16 END SUBROUTINE
17 end