OpenCores
URL https://opencores.org/ocsvn/openrisc_2011-10-31/openrisc_2011-10-31/trunk

Subversion Repositories openrisc_2011-10-31

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [pr41347.f90] - Diff between revs 302 and 384

Only display areas with differences | Details | Blame | View Log

Rev 302 Rev 384
! { dg-do compile }
! { dg-do compile }
! { dg-options "-O3" }
! { dg-options "-O3" }
module hsl_ma41_m
module hsl_ma41_m
   implicit none
   implicit none
   contains
   contains
      subroutine solve_ma41
      subroutine solve_ma41
         integer, dimension(20) :: info
         integer, dimension(20) :: info
         call prininfo(15, info)
         call prininfo(15, info)
      end subroutine solve_ma41
      end subroutine solve_ma41
      subroutine prininfo (ni, info)
      subroutine prininfo (ni, info)
         integer, intent(in) ::  ni
         integer, intent(in) ::  ni
         integer, intent(in), dimension(:) :: info
         integer, intent(in), dimension(:) :: info
         integer i
         integer i
         call prinfo
         call prinfo
         contains
         contains
            subroutine prinfo
            subroutine prinfo
               do i = 1, ni
               do i = 1, ni
                  write(*,'(i5,1x,i0)') i, info(i)
                  write(*,'(i5,1x,i0)') i, info(i)
               end do
               end do
            end subroutine prinfo
            end subroutine prinfo
      end subroutine prininfo
      end subroutine prininfo
end module hsl_ma41_m
end module hsl_ma41_m
 
 

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.