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 -----
  • July
  • June
  • 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

October 2013

  • 1 participants
  • 461 discussions
Re: [GHC] #7971: doesDirectoryExist description differs from its behavior
by GHC 02 Oct '13

02 Oct '13
#7971: doesDirectoryExist description differs from its behavior ------------------------------------------------+-------------------------- Reporter: dsf | Owner: Type: bug | bgamari Priority: normal | Status: closed Component: libraries/directory | Milestone: Resolution: fixed | Version: 7.6.3 Operating System: Unknown/Multiple | Keywords: Type of failure: Incorrect result at runtime | Architecture: Test Case: | Unknown/Multiple Blocking: | Difficulty: | Unknown | Blocked By: | Related Tickets: ------------------------------------------------+-------------------------- Changes (by thoughtpolice): * status: patch => closed * resolution: => fixed Comment: Merged, thanks. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7971#comment:13> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #8393: hsc2hs copies #define/#undef directives to generated .hs file when cross-compiling
by GHC 02 Oct '13

02 Oct '13
#8393: hsc2hs copies #define/#undef directives to generated .hs file when cross- compiling ------------------------------------+------------------------------------- Reporter: rwbarton | Owner: rwbarton Type: bug | Status: new Priority: normal | Milestone: Component: hsc2hs | 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: | ------------------------------------+------------------------------------- See summary. This causes a cross-compilation of ghc to fail while building GHC/Stack.hsc from libraries/base, because base.cabal no longer specifies `extensions: CPP` as of dfb52c3d5. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8393> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 6
0 0
[GHC] #8340: support for generating annotations from TH
by GHC 02 Oct '13

02 Oct '13
#8340: support for generating annotations from TH -------------------------------------------+------------------------------- Reporter: errge | Owner: Type: feature request | Status: new Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.7 Keywords: | Operating System: Architecture: Unknown/Multiple | Unknown/Multiple Difficulty: Easy (less than 1 hour) | Type of failure: Blocked By: | None/Unknown Related Tickets: | Test Case: | Blocking: 7867 -------------------------------------------+------------------------------- This patch adds support for template haskell generation of annotations. This is currently only possible directly via ```{-# ANN function "whatever annotation #-}```. The attached patch makes it possible to do the same from TH. Module and type annotations are supported too. This is part of a larger effort to make it possible to cross-module communicate between template haskell runs. See #7867 for a longer discussion. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8340> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
[GHC] #8283: utils/fingerprint/fingerprint.py doesn't work on Windows
by GHC 02 Oct '13

02 Oct '13
#8283: utils/fingerprint/fingerprint.py doesn't work on Windows -------------------------------------------+------------------------------- Reporter: schyler | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Build System | Version: 7.7 Keywords: | Operating System: Windows Architecture: Unknown/Multiple | Type of failure: Difficulty: Easy (less than 1 hour) | None/Unknown Blocked By: | Test Case: Related Tickets: | Blocking: -------------------------------------------+------------------------------- Invocation: {{{ utils/fingerprint/fingerprint.py create }}} Produces: {{{ WindowsError: [Error 193] %1 is not a valid Win32 application }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8283> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 8
0 0
[GHC] #8343: Interrupting readProcess doesn't work
by GHC 02 Oct '13

02 Oct '13
#8343: Interrupting readProcess doesn't work --------------------------+------------------------------------------------ Reporter: akio | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: | Version: 7.6.3 libraries/base | Operating System: Linux Keywords: | Type of failure: Incorrect result at runtime Architecture: x86_64 | Test Case: (amd64) | Blocking: Difficulty: | Unknown | Blocked By: | Related Tickets: #5766 | --------------------------+------------------------------------------------ The following program should terminate in 1 second, but it does not: {{{ import System.Process import System.Timeout main = timeout 1000000 $ print =<< readProcess "sleep" ["2h"] "" }}} The problem is in the exception handler in {{{readProcess}}}. When it receives an asynchronous exception, it tries to clean up by closing the pipes. However the attempt to close {{{outh}}} blocks because the reader thread (reading with {{{hGetContents}}}) is blocking on the handle. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8343> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
Re: [GHC] #3725: Annotations not written to interface files
by GHC 02 Oct '13

02 Oct '13
#3725: Annotations not written to interface files -------------------------------+------------------------------------------- Reporter: rl | Owner: Type: bug | Status: closed Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.7 Resolution: fixed | Keywords: Operating System: | Architecture: Unknown/Multiple Unknown/Multiple | Difficulty: Easy (less than 1 hour) Type of failure: Other | Blocked By: Test Case: | Related Tickets: Blocking: 7867 | -------------------------------+------------------------------------------- Changes (by thoughtpolice): * status: patch => closed * resolution: => fixed Comment: Merged, thanks! -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/3725#comment:13> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #3725: Annotations not written to interface files
by GHC 02 Oct '13

02 Oct '13
#3725: Annotations not written to interface files -------------------------------+------------------------------------------- Reporter: rl | Owner: Type: bug | Status: patch Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.7 Resolution: | Keywords: Operating System: | Architecture: Unknown/Multiple Unknown/Multiple | Difficulty: Easy (less than 1 hour) Type of failure: Other | Blocked By: Test Case: | Related Tickets: Blocking: 7867 | -------------------------------+------------------------------------------- Comment (by Austin Seipp <austin@…>): In [changeset:bc8a5e14881f0754991390fbc0c37f928887f5eb/ghc]: {{{ #!CommitTicketReference repository="ghc" revision="bc8a5e14881f0754991390fbc0c37f928887f5eb" Persist annotations to interface files (#3725) Authored-by: Gergely Risko <gergely(a)risko.hu> Signed-off-by: Austin Seipp <austin(a)well-typed.com> }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/3725#comment:12> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7028: incorrect link paths for in mac os x after install
by GHC 02 Oct '13

02 Oct '13
#7028: incorrect link paths for in mac os x after install ------------------------------------------+-------------------------------- Reporter: andykitchen | Owner: leroux Type: bug | Status: infoneeded Priority: high | Milestone: 7.8.1 Component: Build System | Version: 7.4.2 Resolution: | Keywords: Operating System: MacOS X | Architecture: x86_64 Type of failure: Installing GHC failed | (amd64) Test Case: | Difficulty: Unknown Blocking: | Blocked By: | Related Tickets: ------------------------------------------+-------------------------------- Changes (by leroux): * status: new => infoneeded Comment: Are you still experiencing these issues with HEAD or 7.6 binary dist? It could be helpful if you would test it with a setup similar the one before. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7028#comment:8> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7028: incorrect link paths for in mac os x after install
by GHC 02 Oct '13

02 Oct '13
#7028: incorrect link paths for in mac os x after install ------------------------------------------+-------------------------------- Reporter: andykitchen | Owner: leroux Type: bug | Status: new Priority: high | Milestone: 7.8.1 Component: Build System | Version: 7.4.2 Resolution: | Keywords: Operating System: MacOS X | Architecture: x86_64 Type of failure: Installing GHC failed | (amd64) Test Case: | Difficulty: Unknown Blocking: | Blocked By: | Related Tickets: ------------------------------------------+-------------------------------- Changes (by leroux): * owner: => leroux -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7028#comment:7> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #6166: Performance regression in mwc-random since 7.0.x
by GHC 01 Oct '13

01 Oct '13
#6166: Performance regression in mwc-random since 7.0.x --------------------------------------------+------------------------------ Reporter: bos | Owner: Type: bug | Status: new Priority: high | Milestone: 7.6.2 Component: Compiler | Version: 7.4.2 Resolution: | Keywords: Operating System: Unknown/Multiple | Architecture: x86_64 Type of failure: Runtime performance bug | (amd64) Test Case: | Difficulty: Unknown Blocking: | Blocked By: | Related Tickets: --------------------------------------------+------------------------------ Comment (by Khudyakov): Another simplification {{{ {-# LANGUAGE BangPatterns #-} import qualified Data.Vector.Unboxed as I import Data.Vector.Unboxed ((!)) import Control.Monad main :: IO () main = replicateM_ (200*1000) (return $! standard) standard :: Double -- Removing or replacing with NOINLINE returns perfomance to normal {-# INLINE standard #-} standard = blocks ! 0 where blocks :: I.Vector Double blocks = I.cons 0.123 $ I.unfoldrN 130 go (T f) where go q@(T a) = Just (log (exp a), q) {-# NOINLINE blocks #-} r,f :: Double r = 3.442619855899 -- replacing f with constant return perfomance to normal -- f = 2.669629083880923e-3 f = exp (-0.5 * r * r) -- replacing data with newtype returns performance to normal data T = T {-# UNPACK #-} !Double }}} Problem is visible at the core level. Code is compiled down to the something similar to following pseudocode: {{{ loop i = if i /= 0 then evaluate (blocks ! 0) >> loop (i-1) else return () }}} blocks array is inlied despite being marked as NOINLINE and is evaluated on each iteration so performance is abysmal. When small chages to the program are made it's not inlined and evaluated only once. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/6166#comment:11> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
  • ← Newer
  • 1
  • ...
  • 42
  • 43
  • 44
  • 45
  • 46
  • 47
  • Older →

HyperKitty Powered by HyperKitty version 1.3.9.