{-# LANGUAGE GADTs #-}
{-# LANGUAGE PolyKinds #-}
module Test where

data Foo :: * -> * where
        Foo :: Foo a