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

May 2014

  • 1 participants
  • 673 discussions
Re: [GHC] #7828: RebindableSyntax and Arrow
by GHC 29 May '14

29 May '14
#7828: RebindableSyntax and Arrow ----------------------------------------------+---------------------------- Reporter: AlessandroVermeulen | Owner: Type: bug | jstolarek Priority: normal | Status: new Component: Compiler (Type checker) | Milestone: 7.10.1 Resolution: | Version: 7.6.2 Operating System: Unknown/Multiple | Keywords: Type of failure: GHC rejects valid program | Architecture: Test Case: | Unknown/Multiple Blocking: | Difficulty: Unknown | Blocked By: | Related Tickets: ----------------------------------------------+---------------------------- Changes (by jstolarek): * cc: ross@…, jan.stolarek@… (added) -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7828#comment:7> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #7828: RebindableSyntax and Arrow
by GHC 29 May '14

29 May '14
#7828: RebindableSyntax and Arrow ----------------------------------------------+---------------------------- Reporter: AlessandroVermeulen | Owner: Type: bug | jstolarek Priority: normal | Status: new Component: Compiler (Type checker) | Milestone: 7.10.1 Resolution: | Version: 7.6.2 Operating System: Unknown/Multiple | Keywords: Type of failure: GHC rejects valid program | Architecture: Test Case: | Unknown/Multiple Blocking: | Difficulty: Unknown | Blocked By: | Related Tickets: ----------------------------------------------+---------------------------- Comment (by jstolarek): I have spent some time on this today and I have some questions. As I understand Simon's comment the idea is to handle the arrow do-notation similarly to the monadic do-notation. Looking at the handling of monadic bind I see that indeed each `BindStmt` stores a unique call to `>>=` and `fail`. These are [https://github.com/ghc/ghc/blob/master/compiler/rename/RnExpr.lhs#L681 generated in the renamer] and then [https://github.com/ghc/ghc/blob/master/compiler/deSugar/DsExpr.lhs#L775 converted to explicit lambda by the desugarer]. For arrow operations - `arr`, `(>>>)`, `first` and possibly `loop`, `(|||)` and `app` - [https://github.com/ghc/ghc/blob/master/compiler/rename/RnExpr.lhs#L416 renamer creates a shared table of names]. [https://github.com/ghc/ghc/blob/master/compiler/deSugar/DsArrows.lhs#L69 Desugarer creates a command environment] that contains identifiers that are shared by all desugared expressions. This basicaly rephrases what Simon wrote. Now I have reached a point where I'm not sure what to do. For monads calls to bind are introduced only (?) when we encounter `BindStmt`. For arrows it is not that simple. For example calls to `>>>` are introduced when we desugar `BodyStmt`, `BindStmt` and `RecStmt` but also by [https://github.com/ghc/ghc/blob/master/compiler/deSugar/DsArrows.lhs#L94 `do_compose`], which does not correspond to any particular source construct but is called in many places of arrow notation desugarer. Another place where we introduce `>>>` is [https://github.com/ghc/ghc/blob/master/compiler/deSugar/DsArrows.lhs#L1038 desugaring of CmdLStmt]. I might be wrong, but it seems to me that adding `SyntaxExpr` to `HsCmd` constructors won't help us here. We need a way of generating fresh calls to desugared arrow operations out of thin air. I also don't understand why is arrow notation [https://github.com/ghc/ghc/blob/master/compiler/rename/RnExpr.lhs#L803 considered not rebindable]? The comment suggests that this is because !DsArrows performs a separate desugaring of arrow notation. Am I right to think that after this change is implemented arrow notation will be marked as rebindable? -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7828#comment:6> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5610: Improve "Unacceptable argument type in foreign declaration" error message
by GHC 29 May '14

29 May '14
#5610: Improve "Unacceptable argument type in foreign declaration" error message -------------------------------------------------+------------------------- Reporter: bgamari | Owner: Type: feature request | Status: new Priority: high | Milestone: 7.4.1 Component: Compiler (Type checker) | Version: Resolution: | 7.6.1-rc1 Operating System: Unknown/Multiple | Keywords: Type of failure: Incorrect warning at | Architecture: compile-time | Unknown/Multiple Test Case: | Difficulty: Blocking: | Unknown | Blocked By: | Related Tickets: -------------------------------------------------+------------------------- Changes (by archblob): * cc: fcsernik@… (added) -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5610#comment:21> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5610: Improve "Unacceptable argument type in foreign declaration" error message
by GHC 29 May '14

29 May '14
#5610: Improve "Unacceptable argument type in foreign declaration" error message -------------------------------------------------+------------------------- Reporter: bgamari | Owner: Type: feature request | Status: new Priority: high | Milestone: 7.4.1 Component: Compiler (Type checker) | Version: Resolution: | 7.6.1-rc1 Operating System: Unknown/Multiple | Keywords: Type of failure: Incorrect warning at | Architecture: compile-time | Unknown/Multiple Test Case: | Difficulty: Blocking: | Unknown | Blocked By: | Related Tickets: -------------------------------------------------+------------------------- Comment (by archblob): I have time to work on this and do a little refactoring to improve the error messages. The comment history is a little confusing and I'm not really sure that a better error message is the only thing requested here, and if the whole importing of constructors for foreign declarations story is also in need of fixing. It's the same story with #7243, if someone could make things clear for me I would be happy to start working. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5610#comment:20> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #4213: LLVM: Add support for TNTC to LLVM compiler suite
by GHC 28 May '14

28 May '14
#4213: LLVM: Add support for TNTC to LLVM compiler suite -------------------------------------+------------------------------------ Reporter: dterei | Owner: dterei Type: feature request | Status: new Priority: low | Milestone: 7.6.2 Component: Compiler (LLVM) | Version: 6.13 Resolution: | Keywords: Operating System: Unknown/Multiple | Architecture: Unknown/Multiple Type of failure: None/Unknown | Difficulty: Unknown Test Case: | Blocked By: 9142 Blocking: | Related Tickets: -------------------------------------+------------------------------------ Comment (by bgamari): Replying to [comment:30 altaic]: > Replying to [comment:24 bgamari]: > > I hope that the LLVM folks would reject outright any proposal to change the semantics of an already released feature in a non-compatible way. > > An already released feature which is likely to have yet to be used in the wild. > It seems like there's a chance that the revision that you suggest might happen. In the [http://lists.cs.uiuc.edu/pipermail/llvmdev/2014-May/073260.html words] of LLVM-er Reid Kleckner, > I worry that symbol_offset combined with prefix are too low-level. What if we split this up into something like prefix data "prologue" data? Prefix data would be an arbitrary LLVM constant, and prologue data is a byte sequence of native executable code. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/4213#comment:34> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #9147: defining data type in GHC results in ghc: panic! (the 'impossible' happened)
by GHC 28 May '14

28 May '14
#9147: defining data type in GHC results in ghc: panic! (the 'impossible' happened) ------------------------------------+------------------------------- Reporter: tdp93422 | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: GHCi | Version: 7.4.1 Keywords: | Operating System: Linux Architecture: Unknown/Multiple | Type of failure: GHCi crash Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ------------------------------------+------------------------------- vagrant@precise32:~/xml$ ghci -XOverloadedStrings GHCi, version 7.4.1: http://www.haskell.org/ghc/ :? for help Loading package ghc-prim ... linking ... done. Loading package integer-gmp ... linking ... done. Loading package base ... linking ... done. Prelude> data Plant = Plant {common :: String, botanical :: String, zone :: Integer, light :: String, price :: String, availability :: String} deriving (read, show, eq, ord) ghc: panic! (the 'impossible' happened) (GHC version 7.4.1 for i386-unknown-linux): nameModule read{tv a9Q} Please report this as a GHC bug: http://www.haskell.org/ghc/reportabug -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9147> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 1
0 0
Re: [GHC] #7828: RebindableSyntax and Arrow
by GHC 28 May '14

28 May '14
#7828: RebindableSyntax and Arrow ----------------------------------------------+---------------------------- Reporter: AlessandroVermeulen | Owner: Type: bug | jstolarek Priority: normal | Status: new Component: Compiler (Type checker) | Milestone: 7.10.1 Resolution: | Version: 7.6.2 Operating System: Unknown/Multiple | Keywords: Type of failure: GHC rejects valid program | Architecture: Test Case: | Unknown/Multiple Blocking: | Difficulty: Unknown | Blocked By: | Related Tickets: ----------------------------------------------+---------------------------- Changes (by jstolarek): * owner: => jstolarek -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/7828#comment:5> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #8038: Old-time is not built when building GHC 7.7.20130704 (perf) for Windows x86_64
by GHC 28 May '14

28 May '14
#8038: Old-time is not built when building GHC 7.7.20130704 (perf) for Windows x86_64 ----------------------------------------+---------------------------------- Reporter: awson | Owner: Type: bug | Status: closed Priority: high | Milestone: 7.8.1 Component: libraries/old-time | Version: 7.7 Resolution: invalid | Keywords: Operating System: Windows | Architecture: x86_64 (amd64) Type of failure: Building GHC failed | Difficulty: Unknown Test Case: | Blocked By: Blocking: | Related Tickets: ----------------------------------------+---------------------------------- Comment (by gidyn): I had this when attempting a parallel make-install without running install first. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/8038#comment:6> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
Re: [GHC] #5599: msys has bad Unicode support
by GHC 28 May '14

28 May '14
#5599: msys has bad Unicode support -------------------------------------------------+------------------------- Reporter: simonpj | Owner: Type: bug | Status: Priority: normal | closed Component: Compiler | Milestone: 7.4.1 Resolution: fixed | Version: 7.2.1 Operating System: Unknown/Multiple | Keywords: Type of failure: None/Unknown | Architecture: Test Case: llibraries/tests/IO/T3307, | Unknown/Multiple environment001 | Difficulty: Blocking: | Unknown | Blocked By: | Related Tickets: -------------------------------------------------+------------------------- Changes (by simonpj): * status: new => closed * testcase: => llibraries/tests/IO/T3307, environment001 * resolution: => fixed Comment: MSYS2 is way better than MSYS, so I think we should just adopt it. I'm making it an expected pass. Simon -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/5599#comment:5> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 0
0 0
[GHC] #9144: Incorrect error reported with poly-kinded type families
by GHC 27 May '14

27 May '14
#9144: Incorrect error reported with poly-kinded type families ------------------------------------+------------------------------------- Reporter: goldfire | Owner: Type: bug | Status: new Priority: normal | Milestone: Component: Compiler | Version: 7.8.2 Keywords: | Operating System: Unknown/Multiple Architecture: Unknown/Multiple | Type of failure: None/Unknown Difficulty: Unknown | Test Case: Blocked By: | Blocking: Related Tickets: | ------------------------------------+------------------------------------- When I compile {{{ {-# LANGUAGE PolyKinds, DataKinds, TypeFamilies, GADTs, RankNTypes #-} module Bug where import Data.Proxy import GHC.TypeLits data family Sing (a :: k) data SomeSing :: KProxy k -> * where SomeSing :: forall (a :: k). Sing a -> SomeSing ('KProxy :: KProxy k) class kproxy ~ 'KProxy => SingKind (kproxy :: KProxy k) where fromSing :: forall (a :: k). Sing a -> DemoteRep ('KProxy :: KProxy k) toSing :: DemoteRep ('KProxy :: KProxy k) -> SomeSing ('KProxy :: KProxy k) type family DemoteRep (kproxy :: KProxy k) :: * data Foo = Bar Nat data FooTerm = BarTerm Integer data instance Sing (x :: Foo) where SBar :: Sing n -> Sing (Bar n) type instance DemoteRep ('KProxy :: KProxy Nat) = Integer type instance DemoteRep ('KProxy :: KProxy Foo) = FooTerm instance SingKind ('KProxy :: KProxy Nat) where fromSing = undefined toSing = undefined instance SingKind ('KProxy :: KProxy Foo) where fromSing (SBar n) = BarTerm (fromSing n) toSing n = case toSing n of SomeSing n' -> SomeSing (SBar n') }}} I get (with `-fprint-explicit-kinds`) {{{ /Users/rae/temp/Bug.hs:33:32: Couldn't match type ‘FooTerm’ with ‘Integer’ Expected type: Integer Actual type: DemoteRep Nat ('KProxy Nat) In the first argument of ‘BarTerm’, namely ‘(fromSing n)’ In the expression: BarTerm (fromSing n) /Users/rae/temp/Bug.hs:34:26: Couldn't match type ‘Integer’ with ‘FooTerm’ Expected type: DemoteRep Nat ('KProxy Nat) Actual type: DemoteRep Foo ('KProxy Foo) In the first argument of ‘toSing’, namely ‘n’ In the expression: toSing n }}} The second error reported is correct -- the last line in the code should start `toSing (FooTerm n) = ...` to fix the code. However, the first error reported is bogus, given that `DemoteRep ('KProxy :: KProxy Nat)` is clearly `Integer`. I tried to simplify the test case with no luck -- sorry. -- Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/9144> GHC <http://www.haskell.org/ghc/> The Glasgow Haskell Compiler
1 4
0 0
  • ← Newer
  • 1
  • ...
  • 54
  • 55
  • 56
  • 57
  • 58
  • 59
  • 60
  • ...
  • 68
  • Older →

HyperKitty Powered by HyperKitty version 1.3.9.