{-# LANGUAGE UndecidableInstances #-} {-# LANGUAGE FlexibleInstances #-} {-# LANGUAGE TypeOperators #-} {-# LANGUAGE TypeFamilies #-} {-# LANGUAGE DataKinds #-} {-# LANGUAGE PolyKinds #-} module Main where import GHC.TypeLits import Html.Type.Internal import Data.Proxy main :: IO () main = pure () where _x_ = undefined :: Test type Test = ( ToList () == 'List '[] "" , ToList Int == 'List '[""] "" , ToList (Proxy "a") == 'List '[] "a" , ToList ('A > Char) == 'List '[""] "" , ToList ('A > Char # 'Div > Int) == 'List '["", "