Skip to content
GitLab
Projects Groups Snippets
  • /
  • Help
    • Help
    • Support
    • Community forum
    • Submit feedback
  • Sign in / Register
  • GHC GHC
  • Project information
    • Project information
    • Activity
    • Labels
    • Members
  • Repository
    • Repository
    • Files
    • Commits
    • Branches
    • Tags
    • Contributors
    • Graph
    • Compare
    • Locked Files
  • Issues 5,263
    • Issues 5,263
    • List
    • Boards
    • Service Desk
    • Milestones
    • Iterations
  • Merge requests 567
    • Merge requests 567
  • CI/CD
    • CI/CD
    • Pipelines
    • Jobs
    • Schedules
    • Test Cases
  • Deployments
    • Deployments
    • Releases
  • Analytics
    • Analytics
    • Value stream
    • CI/CD
    • Code review
    • Insights
    • Issue
    • Repository
  • Wiki
    • Wiki
  • Snippets
    • Snippets
  • Activity
  • Graph
  • Create a new issue
  • Jobs
  • Commits
  • Issue Boards
Collapse sidebar
  • Glasgow Haskell CompilerGlasgow Haskell Compiler
  • GHCGHC
  • Issues
  • #16754
Closed
Open
Issue created Jun 05, 2019 by Ryan Scott@RyanGlScottMaintainer

Can't use multiple names in a standalone kind signature

You can put multiple names in a single type signature, like so:

id1, id2 :: a -> a
id1 = id
id2 = id

However, the same does not hold for StandaloneKindSignatures. For example, the following program fails to parse:

{-# LANGUAGE StandaloneKindSignatures #-}
module Bug where

import Data.Kind

type T1, T2 :: Type -> Type
type T1 = Maybe
type T2 = Maybe
[1 of 1] Compiling Bug              ( Bug.hs, Bug.o )

Bug.hs:6:8: error: parse error on input ‘,’
  |
6 | type T1, T2 :: Type -> Type
  |        ^

This seems like it would be nice to have for consistency's sake.

Edited Nov 12, 2019 by Ryan Scott
To upload designs, you'll need to enable LFS and have an admin enable hashed storage. More information
Assignee
Assign to
Time tracking