OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [spec_expr_4.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 }
! Tests the fix for PR27709 in which the specification expression on
! Tests the fix for PR27709 in which the specification expression on
! line 22 was not resolved because of the multiple component references.
! line 22 was not resolved because of the multiple component references.
!
!
! Contributed by David Ham  
! Contributed by David Ham  
!
!
module elements
module elements
  implicit none
  implicit none
  type element_type
  type element_type
     type(ele_numbering_type), pointer :: numbering
     type(ele_numbering_type), pointer :: numbering
  end type element_type
  end type element_type
  type ele_numbering_type
  type ele_numbering_type
     integer, dimension(:,:), pointer :: number2count
     integer, dimension(:,:), pointer :: number2count
  end type ele_numbering_type
  end type ele_numbering_type
end module elements
end module elements
module global_numbering
module global_numbering
  use elements
  use elements
  implicit none
  implicit none
contains
contains
  function element_local_coords(element) result (coords)
  function element_local_coords(element) result (coords)
    type(element_type), intent(in) :: element
    type(element_type), intent(in) :: element
    real, dimension(size(element%numbering%number2count, 1)) :: coords
    real, dimension(size(element%numbering%number2count, 1)) :: coords
    coords=0.0
    coords=0.0
  end function element_local_coords
  end function element_local_coords
end module global_numbering
end module global_numbering
  use global_numbering
  use global_numbering
  type (element_type) :: e
  type (element_type) :: e
  type (ele_numbering_type), target :: ent
  type (ele_numbering_type), target :: ent
  allocate (ent%number2count (2,2))
  allocate (ent%number2count (2,2))
  e%numbering => ent
  e%numbering => ent
  print *, element_local_coords (e)
  print *, element_local_coords (e)
end
end
! { dg-final { cleanup-modules "elements global_numbering" } }
! { dg-final { cleanup-modules "elements global_numbering" } }
 
 

powered by: WebSVN 2.1.0

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