c: Fix up pointer types to may_alias structures [PR114493]
[official-gcc.git] / gcc / testsuite / gfortran.dg / cshift_shift_real_2.f90
blob0d92945d2375f8c5eeff74269c44ea434d72206a
1 ! { dg-do compile }
2 ! PR35724 Compile time segmentation fault for CSHIFT with negative third arg
3 SUBROUTINE RA0072(DDA,LDA,nf10,nf1,mf1,nf2)
4 REAL DDA(10,10)
5 LOGICAL LDA(10,10)
6 WHERE (LDA) DDA = CSHIFT(DDA,1,-MF1) ! MF1 works, -1 works
7 END SUBROUTINE