i386: More use of m{32,64}bcst addressing modes with ternlog.
[official-gcc.git] / gcc / testsuite / gfortran.dg / pr30391-1.f90
blob28ca75427184473025c6c1ba735cc851333927d8
1 ! { dg-do compile }
2 ! { dg-options "-O1" }
3 SUBROUTINE check_for_overlap (cell_length)
4 REAL, DIMENSION(1:3), INTENT(IN), OPTIONAL :: cell_length
5 REAL, DIMENSION(1:3) :: abc, box_length
7 IF (PRESENT(cell_length)) THEN
8 box_length(1:3)=abc(1:3)
9 ENDIF
10 END SUBROUTINE check_for_overlap