Haskell.org
Sign In Sign Up
Manage this list Sign In Sign Up

Keyboard Shortcuts

Thread View

  • j: Next unread message
  • k: Previous unread message
  • j a: Jump to all threads
  • j l: Jump to MailingList overview

ghc-tickets

Thread Start a new thread
Download
Threads by month
  • ----- 2025 -----
  • May
  • April
  • March
  • February
  • January
  • ----- 2024 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2023 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2022 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2021 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2020 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2019 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2018 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2017 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2016 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2015 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2014 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
  • ----- 2013 -----
  • December
  • November
  • October
  • September
  • August
  • July
  • June
  • May
  • April
  • March
  • February
  • January
ghc-tickets@haskell.org

November 2014

  • 1 participants
  • 1230 discussions
Re: [GHC] #5466: Documentation for Chan could be better
by GHC 27 Nov '14

27 Nov '14
#5466: Documentation for Chan could be better -------------------------------------+------------------------------------- Reporter: pumpkin | Owner: ekmett Type: bug | Status: new Priority: normal | Milestone: ⊥ Component: Core | Version: 7.2.1 Libraries | Keywords: Resolution: | Architecture: Unknown/Multiple Operating System: | Difficulty: Unknown Unknown/Multiple | Blocked By: Type of failure: | Related Tickets: None/Unknown | Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Changes (by thomie): * cc: core-libraries-committee@… (added) * difficulty: => Unknown Old description: > The summary is two words, and none of the operations say whether they > block or not. Someone on reddit was expecting a read to throw an > exception if the Chan was empty, for example. It also turns out that > isEmptyChan is deprecated, but the documentation doesn't mention it. New description: The summary is two words, and none of the operations say whether they block or not. Someone on reddit was expecting a read to throw an exception if the Chan was empty, for example. -- -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5466#comment:3> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5522: mc03 -O -fliberate-case -fspec-constr runs out of memory
by GHC 27 Nov '14

27 Nov '14
#5522: mc03 -O -fliberate-case -fspec-constr runs out of memory -------------------------------------+------------------------------------- Reporter: btutt | Owner: simonpj Type: bug | Status: new Priority: normal | Milestone: 7.10.1 Component: Compiler | Version: 7.3 Resolution: | Keywords: Operating System: | Architecture: Unknown/Multiple Unknown/Multiple | Difficulty: Unknown Type of failure: Compile- | Blocked By: time performance bug | Related Tickets: Test Case: mc03 | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Changes (by thomie): * difficulty: => Unknown * os: Windows => Unknown/Multiple * architecture: x86 => Unknown/Multiple Comment: The immediate issue here is fixed. Test `5522.hs` from comment:2 does not run out of memory anymore. The reason seems to be that HEAD now reduces ''monad'' comprehensions such as `[x0 + x1 | x0 <- [0], x1 <- [1]]` to just `[1]` at compile time, just as 7.8.3 and earlier already did with ''list'' comprehensions. Maybe the real bug is just covered up? This is the output of `ghc -fforce-recomp --make 5522.hs -O -fliberate-case -fspec-constr -ddump-simpl`: {{{ ==================== Tidy Core ==================== Result size of Tidy Core = {terms: 7, types: 5, coercions: 0} Foo.output1 :: Int [GblId, Caf=NoCafRefs, Str=DmdType m, Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=IF_ARGS [] 10 20}] Foo.output1 = GHC.Types.I# 450 output :: [Int] [GblId, Caf=NoCafRefs, Str=DmdType m2, Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=IF_ARGS [] 10 30}] output = GHC.Types.: @ Int Foo.output1 (GHC.Types.[] @ Int) }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5522#comment:5> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5537: ghc doesn't find libffi.so.5 in testsuite
by GHC 27 Nov '14

27 Nov '14
#5537: ghc doesn't find libffi.so.5 in testsuite -------------------------------------+------------------------------------- Reporter: | Owner: daniel.is.fischer | Status: closed Type: bug | Milestone: Priority: low | Version: 7.3 Component: Test Suite | Keywords: Resolution: worksforme | Architecture: Unknown/Multiple Operating System: | Difficulty: Unknown Unknown/Multiple | Blocked By: Type of failure: | Related Tickets: None/Unknown | Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Changes (by thomie): * milestone: 7.10.1 => -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5537#comment:10> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5537: ghc doesn't find libffi.so.5 in testsuite
by GHC 27 Nov '14

27 Nov '14
#5537: ghc doesn't find libffi.so.5 in testsuite -------------------------------------+------------------------------------- Reporter: | Owner: daniel.is.fischer | Status: closed Type: bug | Milestone: 7.10.1 Priority: low | Version: 7.3 Component: Test Suite | Keywords: Resolution: worksforme | Architecture: Unknown/Multiple Operating System: | Difficulty: Unknown Unknown/Multiple | Blocked By: Type of failure: | Related Tickets: None/Unknown | Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Changes (by thomie): * status: new => closed * resolution: => worksforme Comment: Running the testsuite the `dyn` way should work now, but please re-open if this is still an issue. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5537#comment:9> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #9842: No Typeable instance for type-level literals
by GHC 27 Nov '14

27 Nov '14
#9842: No Typeable instance for type-level literals -------------------------------------+------------------------------------- Reporter: Feuerbach | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.8.3 Keywords: | Operating System: Architecture: Unknown/Multiple | Unknown/Multiple Difficulty: Unknown | Type of failure: Blocked By: | None/Unknown Related Tickets: | Test Case: | Blocking: | Differential Revisions: -------------------------------------+------------------------------------- There's no Typeable instance for string and numeric literals. E.g. {{{ Prelude GHC.TypeLits Data.Typeable> typeRep (Proxy :: Proxy "foo") <interactive>:15:1: No instance for (Typeable "foo") arising from a use of ‘typeRep’ In the expression: typeRep (Proxy :: Proxy "foo") In an equation for ‘it’: it = typeRep (Proxy :: Proxy "foo") }}} This means that we can't have a Typeable instance for phantom types parameterised by these literals. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9842> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 4
0 0
[GHC] #9736: Constant folding rules are wrong for GHCJS
by GHC 27 Nov '14

27 Nov '14
#9736: Constant folding rules are wrong for GHCJS -------------------------------------+------------------------------------- Reporter: luite | Owner: luite Type: bug | Status: new Priority: normal | Milestone: 7.10.1 Component: Compiler | Version: 7.8.3 Keywords: | Operating System: Architecture: Unknown/Multiple | Unknown/Multiple Difficulty: Unknown | Type of failure: Blocked By: | None/Unknown Related Tickets: | Test Case: | Blocking: | Differential Revisions: -------------------------------------+------------------------------------- GHCJS currently has a complete copy of PrelRules to work around some issues where the rules depend on the build environment instead of the target. - shiftRightLogical - removeOp32 I'd like to get rid of the copy for 7.10 -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9736> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 6
0 0
Re: [GHC] #7243: regression: acceptable foreign result types
by GHC 27 Nov '14

27 Nov '14
#7243: regression: acceptable foreign result types -------------------------------------+------------------------------------- Reporter: dmwit | Owner: Type: bug | Status: closed Priority: normal | Milestone: 7.10.1 Component: Compiler | Version: 7.6.1 (FFI) | Keywords: Resolution: fixed | Architecture: x86_64 (amd64) Operating System: | Difficulty: Unknown Unknown/Multiple | Blocked By: Type of failure: GHC | Related Tickets: rejects valid program | Test Case: | ffi/should_fail/T7243 | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Changes (by simonpj): * status: new => closed * testcase: => ffi/should_fail/T7243 * resolution: => fixed -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7243#comment:10> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #9830: Standalone-derived Show instance for type constructor has different precedence if orphan instance
by GHC 27 Nov '14

27 Nov '14
#9830: Standalone-derived Show instance for type constructor has different precedence if orphan instance -------------------------------------+------------------------------------- Reporter: RyanGlScott | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.8.3 Keywords: | Operating System: Architecture: Unknown/Multiple | Unknown/Multiple Difficulty: Unknown | Type of failure: Incorrect Blocked By: | result at runtime Related Tickets: | Test Case: | Blocking: | Differential Revisions: -------------------------------------+------------------------------------- If you are using {{{StandaloneDeriving}}} to derive a {{{Show}}} instance for a data type with an infix constructor, its precedence will be different depending on which module the {{{deriving instance ...}}} declaration is in. For example, with this code: {{{#!hs -- InfixShow.hs {-# LANGUAGE StandaloneDeriving #-} module InfixShow where infixr 6 :?: data ADT a b = a :?: b deriving (Eq, Ord, Read) deriving instance (Show a, Show b) => Show (ADT a b) }}} {{{#!hs -- Main.hs module Main where import InfixShow main :: IO () main = do putStrLn $ "Prec 6: " ++ showsPrec 6 ("test" :?: "show") "" putStrLn $ "Prec 7: " ++ showsPrec 7 ("test" :?: "show") "" putStrLn $ "Prec 9: " ++ showsPrec 9 ("test" :?: "show") "" putStrLn $ "Prec 10: " ++ showsPrec 10 ("test" :?: "show") "" }}} Calling {{{runhaskell Main.hs}}} will produce this output, as expected: {{{ Prec 6: "test" :?: "show" Prec 7: ("test" :?: "show") Prec 9: ("test" :?: "show") Prec 10: ("test" :?: "show") }}} However, if the code is changed so that the {{{deriving instance ...}}} declaration is in {{{Main.hs}}} instead: {{{#!hs -- InfixShow.hs module InfixShow where infixr 6 :?: data ADT a b = a :?: b deriving (Eq, Ord, Read) }}} {{{#!hs -- Main.hs {-# LANGUAGE StandaloneDeriving #-} module Main where import InfixShow deriving instance (Show a, Show b) => Show (ADT a b) main :: IO () main = do putStrLn $ "Prec 6: " ++ showsPrec 6 ("test" :?: "show") "" putStrLn $ "Prec 7: " ++ showsPrec 7 ("test" :?: "show") "" putStrLn $ "Prec 9: " ++ showsPrec 9 ("test" :?: "show") "" putStrLn $ "Prec 10: " ++ showsPrec 10 ("test" :?: "show") "" }}} Then the output of {{{runhaskell Main.hs}}} is different: {{{ Prec 6: "test" :?: "show" Prec 7: "test" :?: "show" Prec 9: "test" :?: "show" Prec 10: ("test" :?: "show") }}} This seems to indicate that {{{:?:}}} has the default application precedence (9) instead of the precedence defined in {{{InfixShow}}} (6). -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9830> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
Re: [GHC] #7243: regression: acceptable foreign result types
by GHC 27 Nov '14

27 Nov '14
#7243: regression: acceptable foreign result types -------------------------------------+------------------------------------- Reporter: dmwit | Owner: Type: bug | Status: new Priority: normal | Milestone: 7.10.1 Component: Compiler | Version: 7.6.1 (FFI) | Keywords: Resolution: | Architecture: x86_64 (amd64) Operating System: | Difficulty: Unknown Unknown/Multiple | Blocked By: Type of failure: GHC | Related Tickets: rejects valid program | Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Comment (by Simon Peyton Jones <simonpj@…>): In [changeset:"b61091d3b042305ce21bb00b28a81f903b522394/ghc"]: {{{ #!CommitTicketReference repository="ghc" revision="b61091d3b042305ce21bb00b28a81f903b522394" Test Trac #7243 }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7243#comment:9> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7277: Recompilation check fails for TH unless functions are inlined
by GHC 27 Nov '14

27 Nov '14
#7277: Recompilation check fails for TH unless functions are inlined -------------------------------------+------------------------------------- Reporter: | Owner: orenbenkiki | Status: new Type: bug | Milestone: 7.10.1 Priority: normal | Version: 7.4.2 Component: Template | Keywords: Haskell | Architecture: Unknown/Multiple Resolution: | Difficulty: Unknown Operating System: | Blocked By: Unknown/Multiple | Related Tickets: 481 Type of failure: Incorrect | result at runtime | Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Changes (by nh2): * cc: nh2 (added) -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7277#comment:8> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
  • ← Newer
  • 1
  • ...
  • 74
  • 75
  • 76
  • 77
  • 78
  • 79
  • 80
  • ...
  • 123
  • Older →

HyperKitty Powered by HyperKitty version 1.3.9.