module Pandora.Pattern.Functor.Pointable where

import Pandora.Core.Functor (type (:=>))
import Pandora.Pattern.Functor.Covariant (Covariant)

class Covariant t => Pointable t where
	{-# MINIMAL point #-}
	point :: a :=> t

	pass :: t ()
	pass = () :=> t
forall (t :: * -> *) a. Pointable t => a :=> t
point ()