blob: 1c48dca2f4ace74b91aee11568d686b4adb7d32b [file] [log] [blame]
! { dg-do compile }
! { dg-options "-fsecond-underscore" }
! PR fortran/95091 - ICE in gfc_hash_value
module m2345678901234567890123456789012345678901234567890123456789_123
type t2345678901234567890123456789012345678901234567890123456789_123
end type t2345678901234567890123456789012345678901234567890123456789_123
interface
module subroutine s2345678901234567890123456789012345678901234567890123456789_123 &
(x2345678901234567890123456789012345678901234567890123456789_123)
end
end interface
end
submodule(m2345678901234567890123456789012345678901234567890123456789_123) &
n2345678901234567890123456789012345678901234567890123456789_123
type, extends(t2345678901234567890123456789012345678901234567890123456789_123) :: &
u2345678901234567890123456789012345678901234567890123456789_123
end type
end