ghc icon indicating copy to clipboard operation
ghc copied to clipboard

Mirror of ghc repository. DO NOT SUBMIT PULL REQUESTS HERE

Results 51 ghc issues
Sort by recently updated
recently updated
newest added

Take 3. To use: Keep pushing commits to your own branch, as you've been doing. The commits will appear here as well. But this provides a place to have a...

``` {-# LANGUAGE DeriveDataTypeable, TypeFamilies, TemplateHaskell, DataKinds, PolyKinds, GADTs, RankNTypes, MultiParamTypeClasses, FlexibleInstances, UndecidableInstances, UnicodeSyntax, FunctionalDependencies, StandaloneDeriving, TypeOperators, ScopedTypeVariables, NoMonomorphismRestriction, MonadComprehensions, DeriveGeneric, FlexibleContexts, GeneralizedNewtypeDeriving, ConstraintKinds, LambdaCase, ViewPatterns, AllowAmbiguousTypes, DefaultSignatures, RecursiveDo, --...

From `singletons` (see goldfirere/singletons#153): ``` -- | Convert a normal datatype (like 'Bool') to a singleton for that datatype, -- passing it into a continuation. withSomeSing :: SingKind k =>...

``` {-# LANGUAGE DeriveDataTypeable, TypeFamilies, TemplateHaskell, DataKinds, PolyKinds, GADTs, RankNTypes, MultiParamTypeClasses, FlexibleInstances, UndecidableInstances, UnicodeSyntax, FunctionalDependencies, StandaloneDeriving, TypeOperators, ScopedTypeVariables, NoMonomorphismRestriction, MonadComprehensions, DeriveGeneric, FlexibleContexts, GeneralizedNewtypeDeriving, ConstraintKinds, LambdaCase, ViewPatterns, -- AllowAmbiguousTypes, DefaultSignatures, RecursiveDo,...

This code hangs. :( ``` {-# LANGUAGE DeriveDataTypeable, TypeFamilies, TemplateHaskell, DataKinds, PolyKinds, GADTs, RankNTypes, MultiParamTypeClasses, FlexibleInstances, UndecidableInstances, UnicodeSyntax, FunctionalDependencies, StandaloneDeriving, TypeOperators, ScopedTypeVariables, NoMonomorphismRestriction, MonadComprehensions, DeriveGeneric, FlexibleContexts, GeneralizedNewtypeDeriving, ConstraintKinds, LambdaCase, ViewPatterns,...

[The Dependent Haskell Proposal](https://ghc.haskell.org/trac/ghc/wiki/DependentHaskell) mentions a dependent visible irrelevant quantifier: `forall (...) ->`. Now that we've got visible type application, thanks to Richard's tremendous efforts, I think we're pretty close...

GHC hangs on this: ``` haskell {-# LANGUAGE GADTs, TypeInType #-} import Data.Kind import Data.Proxy data U :: Type where C :: Proxy (u :: U) -> U ```

See here: https://gist.github.com/AndrasKovacs/c7d385aa117929503feb

Currently, this declaration : ``` haskell data A :: * where B :: forall (x :: A). A ``` results in a "AThing evaluated unexpectedly" ghc panic. I think it...

``` {-# LANGUAGE DeriveDataTypeable, TypeFamilies, TemplateHaskell, DataKinds, PolyKinds, GADTs, RankNTypes, MultiParamTypeClasses, FlexibleInstances, UndecidableInstances, CPP, FunctionalDependencies, StandaloneDeriving, TypeOperators, ScopedTypeVariables, NoMonomorphismRestriction, MonadComprehensions, DeriveGeneric, FlexibleContexts, GeneralizedNewtypeDeriving, ConstraintKinds, LambdaCase, ViewPatterns, -- AllowAmbiguousTypes, DefaultSignatures, --...