Skip to content
Snippets Groups Projects
Forked from Glasgow Haskell Compiler / GHC
6368 commits behind the upstream repository.
Code owners
Assign users and groups as approvers for specific file changes. Learn more.
PprOverloadedLabels.hs 354 B
{-# LANGUAGE OverloadedLabels, DataKinds, FlexibleContexts #-}

import GHC.OverloadedLabels

-- No instance for (OverloadedLabel "x" t0)
a = #x

-- No instance for (OverloadedLabel "x" (t0 -> t1), OverloadedLabel "y" t0)
b = #x #y

-- Could not deduce (OverloadedLabel "y" t) from (OverloadedLabel "x" t)
c :: IsLabel "x" t => t
c = #y

main = return ()