-----------------------------------------------------------------------------
-- |
-- Module      :  Control.Monad.Queue.Util
-- Copyright   :  (c) Leon P Smith 2009
-- License     :  BSD3
--
-- Maintainer  :  leon at melding-monads dot com
-- Stability   :  experimental
-- Portability :  portable
--
-----------------------------------------------------------------------------

module Control.Monad.Queue.Util where

import Data.Word

type LenType = Word