(root)/
gcc-13.2.0/
gcc/
testsuite/
gfortran.dg/
pr95687.f90
! { dg-do compile }
! { dg-options "-fsecond-underscore" }
! PR fortran/95687 - ICE in get_unique_hashed_string, at fortran/class.c:508

module m2345678901234567890123456789012345678901234567890123456789_123
  interface
     module subroutine s2345678901234567890123456789012345678901234567890123456789_123
     end
  end interface
end
submodule(m2345678901234567890123456789012345678901234567890123456789_123) &
          n2345678901234567890123456789012345678901234567890123456789_123
  type t2345678901234567890123456789012345678901234567890123456789_123 &
      (a2345678901234567890123456789012345678901234567890123456789_123)
     integer, kind :: a2345678901234567890123456789012345678901234567890123456789_123 = 4
  end type
  class(t2345678901234567890123456789012345678901234567890123456789_123(3)), pointer :: &
        x2345678901234567890123456789012345678901234567890123456789_123
end