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/] [typebound_call_11.f03] - Diff between revs 302 and 384

Go to most recent revision | Only display areas with differences | Details | Blame | View Log

Rev 302 Rev 384
! { dg-do compile }
! { dg-do compile }
!
!
! PR 42048: [F03] Erroneous syntax error message on TBP call
! PR 42048: [F03] Erroneous syntax error message on TBP call
!
!
! Contributed by Damian Rouson 
! Contributed by Damian Rouson 
module grid_module
module grid_module
 implicit none
 implicit none
 type grid
 type grid
 contains
 contains
   procedure :: new_grid
   procedure :: new_grid
 end type
 end type
contains
contains
 subroutine new_grid(this)
 subroutine new_grid(this)
   class(grid) :: this
   class(grid) :: this
 end subroutine
 end subroutine
end module
end module
module field_module
module field_module
 use grid_module
 use grid_module
 implicit none
 implicit none
 type field
 type field
   type(grid) :: mesh
   type(grid) :: mesh
 end type
 end type
contains
contains
 type(field) function new_field()
 type(field) function new_field()
  call new_field%mesh%new_grid()
  call new_field%mesh%new_grid()
 end function
 end function
 function new_field2() result(new)
 function new_field2() result(new)
  type(field) :: new
  type(field) :: new
  call new%mesh%new_grid()
  call new%mesh%new_grid()
 end function
 end function
 type(field) function new_field3()
 type(field) function new_field3()
  call g()
  call g()
 contains
 contains
  subroutine g()
  subroutine g()
    call new_field3%mesh%new_grid()
    call new_field3%mesh%new_grid()
  end subroutine g
  end subroutine g
 end function new_field3
 end function new_field3
end module
end module
! { dg-final { cleanup-modules "grid_module field_module" } }
! { dg-final { cleanup-modules "grid_module field_module" } }
 
 

powered by: WebSVN 2.1.0

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