{-
Copyright (C) 2009-2010 Andrejs Sisojevs <andrejs.sisojevs@nextmail.ru>

All rights reserved.

For license and copyright information, see the file COPYRIGHT
-}

--------------------------------------------------------------------------
--------------------------------------------------------------------------

module Control.Concurrent.STM.TChan.ExtsCommons where

-- | Bigger than @Int@ might not work, because some list functions are used,
-- that consume @Int@
type ChanContentAmountMeasure = Int
type ChanLoad       = ChanContentAmountMeasure
type ChanCapacity   = ChanContentAmountMeasure
type PermitToBlock  = Bool
type WriteSucceeded = Bool
type TakeElementOutShouldWe = Bool