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

March 2015

  • 1 participants
  • 949 discussions
[GHC] #10169: bracket not running the final action on termination through SIGTERM
by GHC 19 Mar '15

19 Mar '15
#10169: bracket not running the final action on termination through SIGTERM -------------------------------------+------------------------------------- Reporter: Kritzefitz | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: | Version: 7.6.3 libraries/base | Operating System: Linux Keywords: | Type of failure: Incorrect result Architecture: x86 | at runtime Test Case: | Blocked By: Blocking: | Related Tickets: Differential Revisions: | -------------------------------------+------------------------------------- If a program compiled with GHC receives a SIGTERM signal, while in a bracket, the final action of the bracket isn't executed. This can be tested with this program: {{{#!hs import Control.Exception import Control.Concurrent main = bracket (return "ending") (\x -> putStrLn x) (\_ -> threadDelay 10000000000) }}} When running this and interrupting with ctrl-c (thus SIGINT) it prints "ending", like expected. When interrupting it with {{{killall -TERM test}}} (assuming the program was named test) "ending" isn't printed and the program terminates immediately. It prints a system specific message though. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/10169> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
[GHC] #10166: GHCi: internal error: stg_ap_p_ret
by GHC 19 Mar '15

19 Mar '15
#10166: GHCi: internal error: stg_ap_p_ret -------------------------------------+------------------------------------- Reporter: | Owner: andreas.abel | Status: new Type: bug | Milestone: Priority: normal | Version: 7.8.4 Component: GHCi | Operating System: Unknown/Multiple Keywords: | Type of failure: None/Unknown Architecture: | Blocked By: Unknown/Multiple | Related Tickets: Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- {{{#!hs import Unsafe.Coerce coerce = Unsafe.Coerce.unsafeCoerce data Nat = Zero | Suc Nat fromNat :: Nat -> Integer fromNat Zero = 0 fromNat (Suc l) = 1 + fromNat l instance Show Nat where show l = show (fromNat l) data Exp = Const Nat | Pred | App Exp Exp eval :: Exp -> a eval (Const n) = coerce n eval e = coerce $ evalP e where evalP Pred Zero = Zero evalP Pred (Suc n) = n evalP e n = evalA e n evalA (App f e) = eval f (eval e) evalA _ = error "eval" -- With type signature, result is 0 (wrong, should be 1) -- Without type signature: internal error: stg_ap_p_ret -- test :: Nat test = eval $ App Pred $ Const $ Suc $ Suc Zero -- main prints 0 should maybe print 1 main :: IO () main = print (coerce test :: Nat) }}} when evaluatiing test at the ghci prompt after loading, I get {{{ <interactive>: internal error: stg_ap_p_ret (GHC version 7.8.3 for x86_64_unknown_linux) Please report this as a GHC bug: http://www.haskell.org/ghc/reportabug Process haskell aborted (core dumped) }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/10166> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
Re: [GHC] #7980: runghc dies silently when given large numbers of arguments. Compiled code does not.
by GHC 18 Mar '15

18 Mar '15
#7980: runghc dies silently when given large numbers of arguments. Compiled code does not. -------------------------------------+------------------------------------- Reporter: totherme | Owner: Type: bug | Status: closed Priority: normal | Milestone: Component: Compiler | Version: 7.6.2 Resolution: fixed | Keywords: Operating System: Linux | Architecture: x86_64 Type of failure: Incorrect result | (amd64) at runtime | Test Case: Blocked By: | Blocking: Related Tickets: #10171 | Differential Revisions: -------------------------------------+------------------------------------- Changes (by rwbarton): * related: => #10171 Comment: (Someone did open a new ticket: #10171.) -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7980#comment:5> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #9921: Building Haddocks with Hoogle output results in an error
by GHC 18 Mar '15

18 Mar '15
#9921: Building Haddocks with Hoogle output results in an error -------------------------------------+------------------------------------- Reporter: snoyberg | Owner: Type: bug | Status: new Priority: normal | Milestone: 7.10.1 Component: Compiler | Version: 7.9 Keywords: | Operating System: Architecture: x86_64 (amd64) | Unknown/Multiple Difficulty: Unknown | Type of failure: Runtime Blocked By: | crash Related Tickets: | Test Case: | Blocking: | Differential Revisions: -------------------------------------+------------------------------------- With the GHC 7.10 release candidate 1 and cabal-install 1.22 (via Herbert's PPA), I unpacked BoundedChan, configured, and then ran the following, with the given output: {{{ $ cabal haddock --hoogle Running Haddock for BoundedChan-1.0.3.0... Preprocessing library BoundedChan-1.0.3.0... Haddock coverage: 100% ( 10 / 10) in 'Control.Concurrent.BoundedChan' haddock: internal error: expectJust getPackageDetails }}} I can reopen against the Haddock repo instead, but I thought this should be on the 7.10 milestone. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9921> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 4
0 0
[GHC] #10115: Unable to run cabal haddock --hoogle on GHC 7.10
by GHC 18 Mar '15

18 Mar '15
#10115: Unable to run cabal haddock --hoogle on GHC 7.10 -------------------------------------+------------------------------------- Reporter: snoyberg | Owner: Type: bug | Status: new Priority: highest | Milestone: Component: Compiler | Version: 7.10.1-rc2 Keywords: | Operating System: Linux Architecture: x86_64 | Type of failure: Runtime crash (amd64) | Blocked By: Test Case: | Related Tickets: Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- At Herbert's recommendation, creating an issue based on the following email I sent to ghc-dev: I'm not really able to follow the details of this, but I wanted to raise to everyone's attention a serious bug with the current GHC 7.10 RC, Cabal 1.22, and/or Haddock. Currently, running `cabal haddock --hoogle` does not work. There seem to be two different issues open about it: https://github.com/haskell/haddock/issues/361 https://github.com/haskell/cabal/issues/2297 I really don't understand the issues here, but I'd claim that the severity of this should probably be a blocker for a GHC 7.10 release. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/10115> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 4
0 0
[GHC] #8315: Improve specialized Hoopl module
by GHC 18 Mar '15

18 Mar '15
#8315: Improve specialized Hoopl module ------------------------------------+------------------------------------- Reporter: jstolarek | Owner: Type: task | Status: new Priority: low | Milestone: Component: Compiler | Version: 7.7 Keywords: | Operating System: Unknown/Multiple Architecture: Unknown/Multiple | Type of failure: None/Unknown Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ------------------------------------+------------------------------------- GHC uses Hoopl to perform some of the Cmm-to-Cmm optimization passes, but instead of relying directly on Hoopl library GHC uses its own specialized module (see [[GhcFile(compiler/cmm/Hoopl/Dataflow.hs)]]). Interface of that module, as well as its internal implementation can be improved. Right now interface places responsibility of maintaining some of the invariants on user. It also ignores differences between forward and backward analysis. [http://ghc.haskell.org/trac/ghc/wiki/Hoopl/Cleanup This wiki page] gives full detail about proposed design changes. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8315> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 1
0 0
Re: [GHC] #1008: Remove unregisterised way
by GHC 18 Mar '15

18 Mar '15
#1008: Remove unregisterised way -------------------------------------+--------------------------------- Reporter: simonmar | Owner: Type: task | Status: closed Priority: low | Milestone: 6.8.1 Component: Compiler | Version: 6.6 Resolution: fixed | Keywords: Operating System: Unknown/Multiple | Architecture: Unknown/Multiple Test Case: | -------------------------------------+--------------------------------- Comment (by Thomas Miedema <thomasmiedema@…>): In [changeset:"3508b68f1a1e9a7ba4cdea5bac4e557739349da1/ghc"]: {{{ #!CommitTicketReference repository="ghc" revision="3508b68f1a1e9a7ba4cdea5bac4e557739349da1" Remove mention of `-unreg` in error message The `-unreg` flag was removed in commit dade8ab (2007), see #1008. [skip-ci] }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/1008#comment:6> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #10138: hpc does not handle absolute paths correctly
by GHC 17 Mar '15

17 Mar '15
#10138: hpc does not handle absolute paths correctly -------------------------------------+------------------------------------- Reporter: thomie | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Code | Version: 7.8.4 Coverage | Operating System: Unknown/Multiple Keywords: | Type of failure: None/Unknown Architecture: | Blocked By: Unknown/Multiple | Related Tickets: Test Case: | Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- See https://github.com/haskell/cabal/issues/2225. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/10138> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
[GHC] Batch modify: #8550, #10009, #10079, #7788, #10141, #10155
by GHC 17 Mar '15

17 Mar '15
Batch modification to #8550, #10009, #10079, #7788, #10141, #10155 by thoughtpolice: milestone to 7.12.1 Comment: Moving to 7.12.1 milestone. -- Tickets URL: <http://ghc.haskell.org/trac/ghc/query?id=8550%2C10009%2C10079%2C7788%2C1014…> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #9963: GHCi panic with --print-libdir flag
by GHC 17 Mar '15

17 Mar '15
#9963: GHCi panic with --print-libdir flag -------------------------------------+------------------------------------- Reporter: jstolarek | Owner: Type: bug | Status: new Priority: high | Milestone: 7.10.1 Component: Driver | Version: 7.9 Keywords: | Operating System: Unknown/Multiple Architecture: | Type of failure: GHCi crash Unknown/Multiple | Blocked By: Test Case: | Related Tickets: Blocking: | Differential Revisions: | -------------------------------------+------------------------------------- Reported on GHC devs: {{{ $ ghc-stage2 --print-libdir /dane/projekty/ghc/build/inplace/lib $ ghc-stage2 --interactive --print-libdir ghc-stage2: panic! (the 'impossible' happened) (GHC version 7.9.20141222 for x86_64-unknown-linux): ghc-stage2: panic! (the 'impossible' happened) (GHC version 7.9.20141222 for x86_64-unknown-linux): v_unsafeGlobalDynFlags: not initialised Please report this as a GHC bug: http://www.haskell.org/ghc/reportabug Please report this as a GHC bug: http://www.haskell.org/ghc/reportabug }}} Does not happen with GHC 7.8.x. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9963> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 5
0 0
  • ← Newer
  • 1
  • ...
  • 80
  • 81
  • 82
  • 83
  • 84
  • 85
  • 86
  • ...
  • 95
  • Older →

HyperKitty Powered by HyperKitty version 1.3.9.