{-# LANGUAGE NoImplicitPrelude #-}

module Data.Morpheus.Ext.Empty
  ( Empty (..),
  )
where

import qualified Data.HashMap.Lazy as HM

class Empty coll where
  empty :: coll

instance Empty [a] where
  empty :: [a]
empty = []

instance Empty (HM.HashMap k v) where
  empty :: HashMap k v
empty = forall k v. HashMap k v
HM.empty