-
Notifications
You must be signed in to change notification settings - Fork 205
Closed
Labels
Description
(i am using Haskell IDE Engine)
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE TypeInType #-}
module Test where
import Data.Singletons.Prelude
import Data.Singletons.TypeLits
import Data.Type.Equality ((:~:) (..), (:~~:) (..))
data instance Sing (z :: (a :~: b)) where
SRefl :: Sing Reflresulting in:
[hlint]
Parse error: :~: