RISC-V: Regenerate opt urls.
[official-gcc.git] / gcc / testsuite / gfortran.dg / internal_pack_19.f90
blob06b916b7d8e3fdd8face6a09db2537164f1e6cdc
1 ! { dg-do compile }
2 ! { dg-options "-Os -fdump-tree-original" }
3 ! Check that internal_pack is called with -Os.
4 module x
5 implicit none
6 contains
7 subroutine bar(a, n)
8 integer, intent(in) :: n
9 integer, intent(in), dimension(n) :: a
10 print *,a
11 end subroutine bar
12 end module x
14 program main
15 use x
16 implicit none
17 integer, parameter :: n = 10
18 integer, dimension(n) :: a
19 integer :: i
20 a = [(i,i=1,n)]
21 call bar(a(n:1:-1),n)
22 end program main
23 ! { dg-final { scan-tree-dump-times "_gfortran_internal_pack" 1 "original" } }