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

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [generic_typebound_operator_1.f90] - Rev 705

Go to most recent revision | Compare with Previous | Blame | View Log

! { dg-do compile }
!
! PR fortran/45916
! ICE with generic type-bound operator

module m_sort
  implicit none
  type, abstract :: sort_t
  contains
    generic :: operator(.gt.) => gt_cmp
    procedure(gt_cmp), deferred :: gt_cmp
  end type sort_t
  interface
    logical function gt_cmp(a,b)
      import
      class(sort_t), intent(in) :: a, b
    end function gt_cmp
  end interface
end module m_sort

! { dg-final { cleanup-modules "m_sort" } }

Go to most recent revision | Compare with Previous | Blame | View Log

powered by: WebSVN 2.1.0

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