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

All rights reserved.

For license and copyright information, see the file COPYRIGHT

-}

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

module Data.Intersectable where

import Data.Typeable

data SetsFit set = NoIntersection | Intersection set | FirstInSecond | SecondInFirst | EqualSets deriving (Show, Typeable)

infixr 9 `setFits`
class Intersectable set where
     setFits :: set -> set -> SetsFit set