PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / spellcheck-procedure_2.f90
blobc390254678f2e9b2239feacdf28ea8f2b574d224
1 ! { dg-do compile }
2 ! test levenshtein based spelling suggestions
5 program spellchekc
6 implicit none (external)
8 interface
9 subroutine bark_unless_zero(iarg)
10 implicit none
11 integer, intent(in) :: iarg
12 end subroutine bark_unless_zero
13 end interface
15 integer :: i
16 i = 0
18 if (i /= 1) STOP 1
19 call bark_unless_0(i) ! { dg-error "not explicitly declared; did you mean .bark_unless_zero.\\?" }
20 ! call complain_about_0(i) ! { -dg-error "not explicitly declared; did you mean .complain_about_zero.\\?" }
22 contains
23 ! We cannot reliably see this ATM, would need an unambiguous bit somewhere
24 subroutine complain_about_zero(iarg)
25 integer, intent(in) :: iarg
26 if (iarg /= 0) STOP 2
27 end subroutine complain_about_zero
29 end program spellchekc
31 subroutine bark_unless_zero(iarg)
32 implicit none
33 integer, intent(in) :: iarg
34 if (iarg /= 0) STOP 3
35 end subroutine bark_unless_zero