Skip to content
  • Simon Peyton Jones's avatar
    Improve the finder's error messages · 6ffbfe99
    Simon Peyton Jones authored
    I'd done all the work to add fuzzy-match suggestions, but they
    weren't really being used!  Here's what you get now
    
       module Foo where
        import Data.Lst
    
    Foo.hs:3:1:
        Failed to load interface for `Data.Lst'
        Perhaps you meant
          Data.List (from base)
          Data.List (needs flag -package haskell2010-1.0.0.0)
          Data.Int (needs flag -package haskell2010-1.0.0.0)
        Use -v to see a list of the files searched for.
    6ffbfe99