module Yi.Buffer.Basic where
import Data.Binary
import Data.Typeable
import GHC.Generics (Generic)
import Data.Ix
import Data.Default
import Yi.Utils
data Direction = Backward | Forward
deriving (Eq, Ord, Typeable, Show, Bounded, Enum, Generic)
instance Binary Direction
reverseDir :: Direction -> Direction
reverseDir Forward = Backward
reverseDir Backward = Forward
mayReverse :: Direction -> [a] -> [a]
mayReverse Forward = id
mayReverse Backward = reverse
directionElim :: Direction -> a -> a -> a
directionElim Backward b _ = b
directionElim Forward _ f = f
newtype Mark = Mark {markId::Int} deriving (Eq, Ord, Show, Typeable, Binary)
newtype BufferRef = BufferRef Int
deriving (Eq, Ord, Typeable, Binary,
Num)
instance Show BufferRef where
show (BufferRef r) = "B#" ++ show r
newtype Point = Point {fromPoint :: Int}
deriving (Eq, Ord, Enum, Bounded, Typeable, Binary, Ix,
Num, Real, Integral)
instance Show Point where
show (Point p) = show p
newtype Size = Size {fromSize :: Int}
deriving (Show, Eq, Ord, Num, Enum, Real, Integral, Binary)
instance SemiNum Point Size where
Point p +~ Size s = Point (p + s)
Point p -~ Size s = Point (p s)
Point p ~- Point q = Size (abs (p q))
newtype WindowRef = WindowRef { unWindowRef :: Int }
deriving(Eq, Ord, Enum, Show, Typeable, Binary)
instance Default WindowRef where def = WindowRef (1)