aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/minmaxloc_4.f90
blob: 673739518dcbb695fc7c98a1126d4110b6e34d24 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
! { dg-do run }
! Test to make sure that PR 33354 remains fixed and doesn't regress
PROGRAM TST
  IMPLICIT NONE
  REAL :: A(1,3)
  A(:,1) = 10
  A(:,2) = 20
  A(:,3) = 30

  !WRITE(*,*) SUM(A(:,1:3),1)
  !WRITE(*,*) MINLOC(SUM(A(:,1:3),1),1)
  if (minloc(sum(a(:,1:3),1),1) .ne. 1) call abort()
  if (maxloc(sum(a(:,1:3),1),1) .ne. 3) call abort()

END PROGRAM TST