[GHC] #13066: Backpack doesn't check for fixity consistency

GHC ghc-devs at haskell.org
Thu Jan 5 03:42:59 UTC 2017


#13066: Backpack doesn't check for fixity consistency
-------------------------------------+-------------------------------------
           Reporter:  ezyang         |             Owner:  ezyang
               Type:  bug            |            Status:  new
           Priority:  normal         |         Milestone:  8.2.1
          Component:  Compiler       |           Version:  8.1
  (Type checker)                     |
           Keywords:  backpack       |  Operating System:  Unknown/Multiple
       Architecture:                 |   Type of failure:  None/Unknown
  Unknown/Multiple                   |
          Test Case:                 |        Blocked By:
           Blocking:                 |   Related Tickets:
Differential Rev(s):                 |         Wiki Page:
-------------------------------------+-------------------------------------
 This should fail, but instead it prints 7.

 {{{
 unit p where
     signature A where
         infixl 6 `mul`
         infixl 7 `plu`
         mul :: Int -> Int -> Int
         plu :: Int -> Int -> Int
     module P where
         import A
         x = 2 `mul` 3 `plu` 1
 unit i where
     module A where
         infixl 7 `mul`
         infixl 6 `plu`
         mul :: Int -> Int -> Int
         mul x y = x * y
         plu :: Int -> Int -> Int
         plu x y = x + y
 unit main where
     dependency p[A=i:A]
     module Main where
         import P
         main = print x
 }}}

--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/13066>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler


More information about the ghc-tickets mailing list