#3275: ghc: panic! (the 'impossible' happened)
-------------------------+--------------------------------------------------
Reporter: EricKow | Owner:
Type: bug | Status: new
Priority: normal | Milestone: 6.10.4
Component: Compiler | Version: 6.10.3
Severity: normal | Resolution:
Keywords: | Difficulty: Unknown
Testcase: | Os: MacOS X
Architecture: x86 |
-------------------------+--------------------------------------------------
Comment (by EricKow):
Success! Here's the smallest I can get it
{{{
{-# OPTIONS_GHC -O2 #-}
module Foo where
import Text.Regex ( matchRegex )
import Data.Maybe ( isJust )
foo :: IO (FilePath -> FilePath)
foo = do
regexes <- return undefined
let isbin f = or $ map (\r -> isJust $ matchRegex r f) regexes
ftf f = if isbin f then undefined else undefined
return ftf
}}}
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/3275#comment:6>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs