{-# LANGUAGE GADTs #-}

module Control.Category.Groupoid where

class Category k => Groupoid k where
    invert :: k a b -> k b a

instance Groupoid (:~:) where
    invert Refl = Refl