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

January 2013

  • 4 participants
  • 484 discussions
Re: [GHC] #2900: Confusing error message for monadic function with wrong number of arguments
by GHC 19 Jan '13

19 Jan '13
#2900: Confusing error message for monadic function with wrong number of arguments --------------------------------------+------------------------------------- Reporter: tim | Owner: Type: bug | Status: closed Priority: normal | Milestone: _|_ Component: Compiler (Type checker) | Version: 6.10.1 Resolution: fixed | Keywords: Os: Unknown/Multiple | Architecture: Unknown/Multiple Failure: None/Unknown | Difficulty: Unknown Testcase: | Blockedby: Blocking: | Related: --------------------------------------+------------------------------------- Changes (by monoidal): * status: new => closed * failure: => None/Unknown * resolution: => fixed Comment: GHC 7.6 gives {{{ X.hs:4:1: Couldn't match type `()' with `m0 ()' Expected type: t0 -> m0 () Actual type: m () The equation(s) for `foo' have two arguments, but its type `Int -> m ()' has only one }}} -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/2900#comment:3> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #1702: type operator precedences don't work in contexts
by GHC 19 Jan '13

19 Jan '13
#1702: type operator precedences don't work in contexts ------------------------------------+--------------------------------------- Reporter: b.hilken@… | Owner: Type: bug | Status: closed Priority: lowest | Milestone: 7.6.2 Component: Compiler | Version: 6.8 Resolution: fixed | Keywords: Os: Unknown/Multiple | Architecture: Unknown/Multiple Failure: None/Unknown | Difficulty: Unknown Testcase: | Blockedby: Blocking: | Related: ------------------------------------+--------------------------------------- Changes (by monoidal): * status: new => closed * failure: => None/Unknown * resolution: => fixed Comment: The code works fine in 7.6, with a minor change (type operators now do not use colons). It might have been fixed when constraint kinds were added. I opened #7609 to note a minor formatting error. {{{ {-# LANGUAGE TypeOperators, MultiParamTypeClasses, FlexibleContexts #-} data (=:) a b data (+:) a b class Disjoint a b infixr 4 =: infixl 3 +: infix 2 `Disjoint` labelZip :: (n =: a `Disjoint` m =: b) => n -> m -> [a] -> [b] -> [n =: a +: m =: b] labelZip = undefined }}} -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/1702#comment:16> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7561: Unnecessary Heap Allocations - Slow Performance
by GHC 19 Jan '13

19 Jan '13
#7561: Unnecessary Heap Allocations - Slow Performance -------------------------------+-------------------------------------------- Reporter: wurmli | Owner: Type: bug | Status: new Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.6.1 Keywords: | Os: Linux Architecture: x86_64 (amd64) | Failure: Runtime performance bug Difficulty: Unknown | Testcase: Blockedby: | Blocking: Related: | -------------------------------+-------------------------------------------- Comment(by wurmli): Let me add a similar case, exemplifying better why I think that not the vector library, but the way the optimiser deals with reductions seems to be the culprit. (That's why I had put "unnecessary heap allocations in the title; #1498 might be a related ticket.) {{{ import System.Environment import Control.Applicative import Control.Monad import Control.Monad.ST import qualified Data.Vector.Storable.Mutable as VSM import qualified Data.Vector.Storable as G ------------------------------------------------------------------- -- Increment counter by 1 acc1 v = do{ k<-VSM.read v 0; VSM.write v 0 (k+1) } -- Increment counter 4 times by 1 until limit is reached -- i.e. each loop adds 4 whileModify1 :: G.MVector s Int -> ST s () whileModify1 v = do go <- do{ k<-VSM.read v 0; n<-VSM.read v 1; return (compare k n)} case go of LT -> do {acc1 v; acc1 v; acc1 v; acc1 v; whileModify1 v} EQ -> return () GT -> return () ------------------------------------------------------------------- -- Increment counter by 2 acc2 v = do{ k<-VSM.read v 0; VSM.write v 0 (k+1); k<-VSM.read v 0; VSM.write v 0 (k+1); } -- Increment counter twice by 2 until limit is reached -- i.e. each loop adds 4 whileModify2 :: G.MVector s Int -> ST s () whileModify2 v = do go <- do{ k<-VSM.read v 0; n<-VSM.read v 1; return (compare k n)} case go of LT -> do {acc2 v; acc2 v; whileModify2 v} EQ -> return () GT -> return () -------------------------------------------------------------------- -- Case 1 is fast with low use of heap space -- Case 2 is slow with high use of heap (about 400 times slower, 300 times more heap) testAcc :: Int -> Int -> G.Vector Int testAcc a n = runST $ do v <- (G.thaw $ G.fromList [0,n]) :: ST s (G.MVector s Int) case a of 1 -> whileModify1 v 2 -> whileModify2 v G.freeze v main = do let k = 50000000 n <- read.head <$> getArgs putStrLn $ show $ testAcc n k }}} The llvm backend improves timing about 4 fold {{{ ghc -threaded -rtsopts -O2 -fllvm heapAndSpeed.hs }}} Even though the two ways of increasing the counter are almost the same, the resulting code behaves vastly different, not only in speed, but also in heap usage (and garbage collector activity). {{{ ./heapAndSpeed 1 +RTS -s fromList [50000000,50000000] 74,088 bytes allocated in the heap 6,296 bytes copied during GC 47,184 bytes maximum residency (1 sample(s)) 18,352 bytes maximum slop 1 MB total memory in use (0 MB lost due to fragmentation) ... INIT time 0.00s ( 0.00s elapsed) MUT time 0.02s ( 0.02s elapsed) GC time 0.00s ( 0.00s elapsed) EXIT time 0.00s ( 0.00s elapsed) Total time 0.02s ( 0.02s elapsed) }}} {{{ ./heapAndSpeed 2 +RTS -s fromList [50000000,50000000] 25,000,074,088 bytes allocated in the heap 7,048,952 bytes copied during GC 47,184 bytes maximum residency (2 sample(s)) 22,448 bytes maximum slop 1 MB total memory in use (0 MB lost due to fragmentation) ... INIT time 0.00s ( 0.00s elapsed) MUT time 8.06s ( 8.07s elapsed) GC time 0.17s ( 0.17s elapsed) EXIT time 0.00s ( 0.00s elapsed) Total time 8.23s ( 8.24s elapsed) }}} -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7561#comment:5> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #4471: Incorrect Unicode output on Windows Console
by GHC 19 Jan '13

19 Jan '13
#4471: Incorrect Unicode output on Windows Console -------------------------+-------------------------------------------------- Reporter: sankeld | Owner: Type: bug | Status: new Priority: low | Milestone: 7.6.2 Component: Compiler | Version: 6.12.3 Keywords: | Os: Windows Architecture: x86 | Failure: Incorrect result at runtime Difficulty: | Testcase: Blockedby: | Blocking: Related: | -------------------------+-------------------------------------------------- Changes (by ekmett): * cc: ekmett@… (added) -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/4471#comment:15> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7561: Unnecessary Heap Allocations - Slow Performance
by GHC 18 Jan '13

18 Jan '13
#7561: Unnecessary Heap Allocations - Slow Performance -------------------------------+-------------------------------------------- Reporter: wurmli | Owner: Type: bug | Status: new Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.6.1 Keywords: | Os: Linux Architecture: x86_64 (amd64) | Failure: Runtime performance bug Difficulty: Unknown | Testcase: Blockedby: | Blocking: Related: | -------------------------------+-------------------------------------------- Changes (by PHO): * cc: pho@… (added) -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7561#comment:4> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7542: GHC doesn't optimize (strict) composition with id
by GHC 18 Jan '13

18 Jan '13
#7542: GHC doesn't optimize (strict) composition with id ---------------------------------+------------------------------------------ Reporter: shachaf | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.6.1 Keywords: | Os: Unknown/Multiple Architecture: Unknown/Multiple | Failure: Runtime performance bug Difficulty: Unknown | Testcase: Blockedby: | Blocking: Related: | ---------------------------------+------------------------------------------ Changes (by PHO): * cc: pho@… (added) -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7542#comment:6> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7519: CLK_TCK is not always a constant
by GHC 18 Jan '13

18 Jan '13
#7519: CLK_TCK is not always a constant ---------------------------------+------------------------------------------ Reporter: singpolyma | Owner: Type: bug | Status: patch Priority: normal | Milestone: Component: libraries/base | Version: 7.7 Keywords: qnx | Os: Other Architecture: Unknown/Multiple | Failure: Building GHC failed Difficulty: Unknown | Testcase: Blockedby: | Blocking: Related: | ---------------------------------+------------------------------------------ Comment(by kgardas): Looks like QNX and Solaris do exactly the same thing! -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7519#comment:5> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7519: CLK_TCK is not always a constant
by GHC 18 Jan '13

18 Jan '13
#7519: CLK_TCK is not always a constant ---------------------------------+------------------------------------------ Reporter: singpolyma | Owner: Type: bug | Status: patch Priority: normal | Milestone: Component: libraries/base | Version: 7.7 Keywords: qnx | Os: Other Architecture: Unknown/Multiple | Failure: Building GHC failed Difficulty: Unknown | Testcase: Blockedby: | Blocking: Related: | ---------------------------------+------------------------------------------ Comment(by singpolyma): This also affects Solaris: http://www.haskell.org/pipermail/ghc- devs/2013-January/000095.html -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7519#comment:4> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #7605: HscStats.lhs is not used in the build process
by GHC 18 Jan '13

18 Jan '13
#7605: HscStats.lhs is not used in the build process -----------------------------+---------------------------------------------- Reporter: jstolarek | Owner: Type: task | Status: new Priority: normal | Component: Compiler Version: 7.7 | Keywords: Os: Unknown/Multiple | Architecture: Unknown/Multiple Failure: None/Unknown | Blockedby: Blocking: | Related: -----------------------------+---------------------------------------------- The file [[GhcFile(main/compiler/HscStats.lhs)]] is not used in the build process, since there is [[GhcFile(main/compiler/HscStats.hs)]] that overrides it. I thought it would be safe to delete !HscStats.lhs but in fact it has been modified recently (about a month ago) and I can't figure out whether these changes should be merged into !HscStats.hs. -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7605> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 3
0 0
[GHC] #7594: GHCi becomes confused about IO type
by GHC 18 Jan '13

18 Jan '13
#7594: GHCi becomes confused about IO type -----------------------------+---------------------------------------------- Reporter: Khudyakov | Owner: Type: bug | Status: new Priority: normal | Component: GHCi Version: 7.6.1 | Keywords: Os: Unknown/Multiple | Architecture: Unknown/Multiple Failure: None/Unknown | Blockedby: Blocking: | Related: -----------------------------+---------------------------------------------- {{{ {-# LANGUAGE FlexibleInstances #-} {-# LANGUAGE UndecidableInstances #-} {-# LANGUAGE MultiParamTypeClasses #-} {-# LANGUAGE KindSignatures #-} {-# LANGUAGE TypeOperators #-} {-# LANGUAGE ConstraintKinds #-} {-# LANGUAGE GADTs #-} {-# LANGUAGE Rank2Types #-} import GHC.Prim (Constraint) class (c1 t, c2 t) => (:&:) (c1 :: * -> Constraint) (c2 :: * -> Constraint) (t :: *) instance (c1 t, c2 t) => (:&:) c1 c2 t data ColD c where ColD :: (c a) => a -> ColD c app :: (forall a. (c a) => a -> b) -> ColD c -> b app f (ColD x) = f x q :: ColD (Show :&: Real) q = ColD (1.2 :: Double) }}} In the interactive mode it's possible to confuse GHCi about IO type. It tries to show expression instread of executing it. {{{ *Main> app print q <interactive>:3:1: No instance for (Show (IO ())) arising from a use of `print' Possible fix: add an instance declaration for (Show (IO ())) In a stmt of an interactive GHCi command: print it }}} -- Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/7594> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 2
0 0
  • ← Newer
  • 1
  • ...
  • 36
  • 37
  • 38
  • 39
  • 40
  • 41
  • 42
  • ...
  • 49
  • Older →

HyperKitty Powered by HyperKitty version 1.3.9.