{-
 -      ``Control/Monad/Event/Internal/EventID''
 -}
{-# LANGUAGE
    GeneralizedNewtypeDeriving
  #-}

module Control.Monad.Event.Internal.EventID where

-- |An opaque identifier for events.
newtype EventID = EventID Int
        deriving (Eq, Ord, Enum)

instance Show EventID where
    showsPrec p (EventID i) = showsPrec p i