Forked from
Glasgow Haskell Compiler / GHC
6363 commits behind the upstream repository.
-
Alan Zimmerman authored
Closes #19903 Note: the normal ppr does not reproduce unicode linear arrows, so that part of the normal printing test is ommented out in the Makefile for this test. See #18846
Alan Zimmerman authoredCloses #19903 Note: the normal ppr does not reproduce unicode linear arrows, so that part of the normal printing test is ommented out in the Makefile for this test. See #18846
Code owners
Assign users and groups as approvers for specific file changes. Learn more.
PprLinearArrow.hs 367 B
{-# LANGUAGE LinearTypes, DataKinds, UnicodeSyntax #-}
module PprLinearArrow where
import GHC.Types (Multiplicity(One, Many))
n1 :: a %1 -> b
n1 = undefined
u1 :: a %1 → b
u1 = undefined
n2 :: a %(Many) -> b
n2 = undefined
u2 :: a %(Many) → b
u2 = undefined
m3 :: a ⊸ b
m3 = undefined
n4 :: a %p -> b
n4 = undefined
u4 :: a %p → b
u4 = undefined