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

February 2014

  • 1 participants
  • 603 discussions
[GHC] #8794: Unresolved @ArSupportsAtFile@ on Solaris distribution.
by GHC 20 Feb '14

20 Feb '14
#8794: Unresolved @ArSupportsAtFile@ on Solaris distribution. --------------------------------+------------------------------------------ Reporter: kgardas | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Build System | Version: 7.6.3 Keywords: | Operating System: Solaris Architecture: x86_64 | Type of failure: Installing GHC failed (amd64) | Test Case: Difficulty: Unknown | Blocking: Blocked By: | Related Tickets: | --------------------------------+------------------------------------------ While configuring ghc binary distribution on Solaris I've noted that settings file is not correctly generated: {{{ $ cat settings [("GCC extra via C opts", " -fwrapv"), ("C compiler command", "/usr/sfw/bin/gcc"), ("C compiler flags", " "), ("ar command", "/usr/xpg4/bin/ar"), ("ar flags", "clqs"), ("ar supports at file", "@ArSupportsAtFile@"), ("touch command", "touch"), ("dllwrap command", "/bin/false"), ("windres command", "/bin/false"), ("perl command", "/usr/bin/perl"), ("target os", "OSSolaris2"), ("target arch", "ArchX86"), ("target word size", "4"), ("target has GNU nonexec stack", "True"), ("target has .ident directive", "True"), ("target has subsections via symbols", "False"), ("LLVM llc command", "llc"), ("LLVM opt command", "opt") ] }}} Looks like @ArSupportsAtFile@ is not filled with the right value. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8794> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 6
0 0
[GHC] #8810: rts/RetainerProfile.c: include missing header for 'markStableTables'
by GHC 20 Feb '14

20 Feb '14
#8810: rts/RetainerProfile.c: include missing header for 'markStableTables' ----------------------------------+------------------------------------- Reporter: slyfox | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.8.1-rc1 Keywords: | Operating System: Unknown/Multiple Architecture: x86_64 (amd64) | Type of failure: None/Unknown Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ----------------------------------+------------------------------------- Found by clang when building unreg compiler (but should affect all builds): {{{ rts_dist_HC rts/dist/build/RetainerProfile.p_o rts/RetainerProfile.c:1779:5: error: implicit declaration of function 'markStableTables' is invalid in C99 [-Werror,-Wimplicit-function-declaration] markStableTables(retainRoot, NULL); ^ }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8810> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 5
0 0
Re: [GHC] #5682: Properly parse promoted data constructor operators
by GHC 20 Feb '14

20 Feb '14
#5682: Properly parse promoted data constructor operators -------------------------------------+------------------------------------- Reporter: lunaris | Owner: Type: bug | Status: merge Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.8.1-rc1 (Parser) | Keywords: PolyKinds, ghc- Resolution: | kinds Operating System: Unknown/Multiple | Architecture: Unknown/Multiple Type of failure: GHC rejects | Difficulty: Unknown valid program | Blocked By: Test Case: | Related Tickets: #8486 parser/should_compile/T5682 | Blocking: | -------------------------------------+------------------------------------- Changes (by thoughtpolice): * status: new => merge Comment: Thanks, merged! -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5682#comment:19> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5682: Properly parse promoted data constructor operators
by GHC 20 Feb '14

20 Feb '14
#5682: Properly parse promoted data constructor operators -------------------------------------+------------------------------------- Reporter: lunaris | Owner: Type: bug | Status: new Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.8.1-rc1 (Parser) | Keywords: PolyKinds, ghc- Resolution: | kinds Operating System: Unknown/Multiple | Architecture: Unknown/Multiple Type of failure: GHC rejects | Difficulty: Unknown valid program | Blocked By: Test Case: | Related Tickets: #8486 parser/should_compile/T5682 | Blocking: | -------------------------------------+------------------------------------- Comment (by Austin Seipp <austin@…>): In [changeset:"d3af9807ca8a1db0bc9298ea50895ee9df55edb7/ghc"]: {{{ #!CommitTicketReference repository="ghc" revision="d3af9807ca8a1db0bc9298ea50895ee9df55edb7" Really fix #5682 (parsing of promoted datacons) Patch submitted by an anonymous friend on the bug tracker. This also fixes TH_RichKinds2 which had a slight message output wibble (it uses the qualified name of the promoted datacon) Signed-off-by: Austin Seipp <austin(a)well-typed.com> }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5682#comment:18> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7689: Primitive bitwise operations on Int#
by GHC 19 Feb '14

19 Feb '14
#7689: Primitive bitwise operations on Int# ------------------------------------------------+-------------------------- Reporter: jstolarek | Owner: Type: feature request | Status: closed Priority: normal | Milestone: 7.8.1 Component: Compiler | Version: 7.7 Resolution: fixed | Keywords: Operating System: Unknown/Multiple | Architecture: Type of failure: None/Unknown | Unknown/Multiple Test Case: primops/should_run/T7689.hs | Difficulty: Blocking: | Unknown | Blocked By: | Related Tickets: ------------------------------------------------+-------------------------- Comment (by Herbert Valerio Riedel <hvr@…>): In [changeset:"0fc4fb5477d3ca22a8b6894db5b1112b9badfdc4/base"]: {{{ #!CommitTicketReference repository="base" revision="0fc4fb5477d3ca22a8b6894db5b1112b9badfdc4" Use new bitwise Int# primops in Data.Bits (re #8791) The new primops (see also #7689) allow to optimize `instance Bits Int` by allowing to operate directly on Int# instead of having to convert to Word# and back to Int# again. Authored-by: Chris Dueck <crdueck(a)uwaterloo.ca> Signed-off-by: Herbert Valerio Riedel <hvr(a)gnu.org> }}} -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7689#comment:11> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #8803: ghc panic ((!!): index too large) when building some packages
by GHC 19 Feb '14

19 Feb '14
#8803: ghc panic ((!!): index too large) when building some packages ----------------------------------+--------------------------------------- Reporter: joelteon | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.8.1-rc1 Keywords: | Operating System: MacOS X Architecture: x86_64 (amd64) | Type of failure: Compile-time crash Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ----------------------------------+--------------------------------------- I'm not 100% sure what the cause of this is, because I can't get a reproducible test case. If I try to build `postgresql-simple`, this is the output from cabal (with `-v3`): https://gist.github.com/anonymous/bda9095cee1eda5640c0 Wondered whether it was related to hs-boot files, but I cannot reproduce the error with the basic example from http://www.haskell.org/ghc/docs/7.0.3/html/users_guide/separate- compilation.html. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8803> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 1
0 0
[GHC] #8762: Panic involving unboxed tuples and phantom types
by GHC 19 Feb '14

19 Feb '14
#8762: Panic involving unboxed tuples and phantom types ------------------------------------+------------------------------------- Reporter: josef | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.6.3 Keywords: | Operating System: Unknown/Multiple Architecture: Unknown/Multiple | Type of failure: None/Unknown Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ------------------------------------+------------------------------------- I ran into a bug involving unboxed tuples and the following piece of code is an attempt at isolating the problem: {{{ {-# LANGUAGE UnboxedTuples #-} module Main where type Ty a = Int bug :: Ty a -> (# Ty a, () #) bug ty = (# ty, () #) main = do let (# a, b #) = bug undefined return () }}} It seems that the phantom type is necessary to trigger the bug. The bug is still present in 7.8rc1. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8762> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 6
0 0
[GHC] #8739: ($) returning kind # no longer type checks
by GHC 19 Feb '14

19 Feb '14
#8739: ($) returning kind # no longer type checks ------------------------------------+------------------------------------- Reporter: NeilMitchell | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.8.1-rc1 Keywords: | Operating System: Unknown/Multiple Architecture: Unknown/Multiple | Type of failure: None/Unknown Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ------------------------------------+------------------------------------- Given: {{{ {-# LANGUAGE MagicHash #-} module InnerLoop(go) where import GHC.Exts go :: () -> Int# go () = go $ () }}} This type checks fine on GHC 7.2.3, and I have a similar version that works fine with 7.4 and 7.6. However, with GHC 7.8.20140130, I get: {{{ InnerLoop.hs:5:9: Kind incompatibility when matching types: s0 :: * Int# :: # In the expression: go $ () In an equation for `go': go () = go $ () }}} This code was reduced from [http://neilmitchell.blogspot.co.uk/2014/01 /optimising-haskell-for-tight-inner-loop.html this blog post], and code which triggers a similar bug can be [https://github.com/ndmitchell/shake/issues/94 found in Shake]. I know {{{$}}} has special type checking rules, were they removed or changed? -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8739> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 9
0 0
[GHC] #8705: Type inference regression with local dictionaries
by GHC 19 Feb '14

19 Feb '14
#8705: Type inference regression with local dictionaries -------------------------------------------+------------------------------- Reporter: goldfire | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler (Type checker) | Version: 7.7 Keywords: | Operating System: Architecture: Unknown/Multiple | Unknown/Multiple Difficulty: Unknown | Type of failure: Blocked By: | None/Unknown Related Tickets: | Test Case: | Blocking: -------------------------------------------+------------------------------- Consider this code: {{{ {-# LANGUAGE ScopedTypeVariables, TypeOperators, DataKinds, MultiParamTypeClasses, GADTs, ConstraintKinds #-} import Data.Singletons.Prelude import GHC.Exts data Dict c where Dict :: c => Dict c -- A less-than-or-equal relation among naturals class a :<=: b sLeq :: Sing n -> Sing n2 -> Dict (n :<=: n2) sLeq = undefined insert_ascending :: forall n lst n1. (lst ~ '[n1]) => Proxy n1 -> Sing n -> SList lst -> Dict (n :<=: n1) insert_ascending _ n lst = case lst of -- If lst has one element... SCons h _ -> case sLeq n h of -- then check if n is <= h Dict -> Dict -- if so, we're done }}} (adapted from [https://github.com/goldfirere/singletons/blob/master/Test/InsertionSortImp.… this file]) GHC 7.6.3 compiles without incident. When I run HEAD (with `-fprint- explicit-kinds`), I get {{{ Ins.hs:25:17: Could not deduce (n :<=: n1) arising from a use of ‛Dict’ from the context ((~) [*] lst ((':) * n1 ('[] *))) bound by the type signature for insert_ascending :: (~) [*] lst ((':) * n1 ('[] *)) => Proxy * n1 -> Sing * n -> SList * lst -> Dict (n :<=: n1) at Ins.hs:(20,21)-(21,70) or from ((~) [*] lst ((':) * n0 n2)) bound by a pattern with constructor SCons :: forall (a0 :: BOX) (z0 :: [a0]) (n0 :: a0) (n1 :: [a0]). (~) [a0] z0 ((':) a0 n0 n1) => Sing a0 n0 -> Sing [a0] n1 -> Sing [a0] z0, in a case alternative at Ins.hs:24:7-15 or from (n :<=: n0) bound by a pattern with constructor Dict :: forall (c :: Constraint). (c) => Dict c, in a case alternative at Ins.hs:25:9-12 Possible fix: add (n :<=: n1) to the context of the data constructor ‛Dict’ or the data constructor ‛SCons’ or the type signature for insert_ascending :: (~) [*] lst ((':) * n1 ('[] *)) => Proxy * n1 -> Sing * n -> SList * lst -> Dict (n :<=: n1) In the expression: Dict In a case alternative: Dict -> Dict In the expression: case sLeq n h of { Dict -> Dict } }}} If you stare at the type error long enough, you will see that GHC should be able to type-check this. The test case requires singletons-0.9.x, but is already much reduced. Interestingly, if all the "givens" are put in the top-level type signature, GHC does its job well. It seems that the act of unpacking the dictionaries is causing the problem. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8705> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 9
0 0
Re: [GHC] #7068: Extensive Memory usage (regression)
by GHC 19 Feb '14

19 Feb '14
#7068: Extensive Memory usage (regression) -------------------------------------------------+------------------------- Reporter: waldheinz | Owner: Type: bug | simonpj Priority: high | Status: new Component: Compiler | Milestone: 7.8.1 Resolution: | Version: 7.4.1 Operating System: Unknown/Multiple | Keywords: Type of failure: Compile-time performance bug | Architecture: Test Case: | Unknown/Multiple Blocking: | Difficulty: | Unknown | Blocked By: | Related Tickets: -------------------------------------------------+------------------------- Changes (by bjp): * cc: bjp@… (added) -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7068#comment:8> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
  • ← Newer
  • 1
  • ...
  • 41
  • 42
  • 43
  • 44
  • 45
  • 46
  • 47
  • ...
  • 61
  • Older →

HyperKitty Powered by HyperKitty version 1.3.9.