{-# LANGUAGE DeriveGeneric #-}
module Terminal.Game.Plane where
import qualified Data.Array as A
import qualified Data.List as L
import qualified Data.List.Split as LS
import qualified Data.Tuple as T
import qualified GHC.Generics as G
import qualified System.Console.ANSI as CA
type Coords = (Row, Column)
type Row = Integer
type Column = Integer
type Width = Integer
type Height = Integer
type Bold = Bool
type Reversed = Bool
data Cell = CellChar Char Bold
Reversed (Maybe (CA.Color, CA.ColorIntensity))
| Transparent
deriving (Show, Eq, Ord, G.Generic)
newtype Plane = Plane { fromPlane :: A.Array Coords Cell }
deriving (Show, Eq, G.Generic)
creaCell :: Char -> Cell
creaCell ch = CellChar ch False False Nothing
colorCell :: CA.Color -> CA.ColorIntensity -> Cell -> Cell
colorCell k i (CellChar c b r _) = CellChar c b r (Just (k, i))
colorCell _ _ Transparent = Transparent
boldCell :: Cell -> Cell
boldCell (CellChar c _ r k) = CellChar c True r k
boldCell Transparent = Transparent
reverseCell :: Cell -> Cell
reverseCell (CellChar c b _ k) = CellChar c b True k
reverseCell Transparent = Transparent
stringPlane :: String -> Plane
stringPlane t = stringPlaneGeneric Nothing t
stringPlaneTrans :: Char -> String -> Plane
stringPlaneTrans c t = stringPlaneGeneric (Just c) t
blankPlane :: Width -> Height -> Plane
blankPlane w h = listPlane (h, w) (repeat $ creaCell ' ')
makeTransparent :: Char -> Plane -> Plane
makeTransparent tc p = mapPlane f p
where
f cl | cellChar cl == tc = Transparent
| otherwise = cl
makeOpaque :: Plane -> Plane
makeOpaque p = let (w, h) = planeSize p
in pastePlane p (blankPlane w h) (1, 1)
pastePlane :: Plane -> Plane -> Coords -> Plane
pastePlane p1 p2 (r, c) = updatePlane p2 filtered
where
cs = assocsPlane p1
(w2, h2) = planeSize p2
traslated = fmap (\((r1, c1), cl) -> ((r1 + r - 1, c1 + c -1), cl))
cs
filtered = filter (\x -> inside x && solid x) traslated
inside ((r1, c1), _) | r1 >= 1 && r1 <= h2 &&
c1 >= 1 && c1 <= w2 = True
| otherwise = False
solid (_, Transparent) = False
solid _ = True
trimPlane :: Plane -> Width -> Height -> Plane
trimPlane p wt ht = pastePlane p (blankPlane w h) (1, 1)
where
(wp, hp) = planeSize p
w = min wt wp
h = min ht hp
planeSize :: Plane -> (Width, Height)
planeSize p = T.swap . snd $ A.bounds (fromPlane p)
cellChar :: Cell -> Char
cellChar (CellChar c _ _ _) = c
cellChar Transparent = ' '
cellColor :: Cell -> Maybe (CA.Color, CA.ColorIntensity)
cellColor (CellChar _ _ _ k) = k
cellColor Transparent = Nothing
isBold :: Cell -> Bool
isBold (CellChar _ b _ _) = b
isBold _ = False
isReversed :: Cell -> Bool
isReversed (CellChar _ _ r _) = r
isReversed _ = False
assocsPlane :: Plane -> [(Coords, Cell)]
assocsPlane p = A.assocs (fromPlane p)
paperPlane :: Plane -> String
paperPlane p = unlines . LS.chunksOf w .
map cellChar . A.elems $ fromPlane p
where
w :: Int
w = fromIntegral . fst . planeSize $ p
mapPlane :: (Cell -> Cell) -> Plane -> Plane
mapPlane f (Plane a) = Plane $ fmap f a
updatePlane :: Plane -> [(Coords, Cell)] -> Plane
updatePlane (Plane a) kcs = Plane $ a A.// kcs
listPlane :: Coords -> [Cell] -> Plane
listPlane (r, c) cs = Plane $ A.listArray ((1,1), (r, c)) cs
stringPlaneGeneric :: Maybe Char -> String -> Plane
stringPlaneGeneric mc t = vitrous
where
lined = lines t
h :: Integer
h = L.genericLength lined
w :: Integer
w = maximum (map L.genericLength lined)
pad :: Integer -> String -> String
pad mw tl = take (fromIntegral mw) (tl ++ repeat ' ')
padded :: [String]
padded = map (pad w) lined
celled :: [Cell]
celled = map creaCell . concat $ padded
plane :: Plane
plane = listPlane (h, w) celled
vitrous :: Plane
vitrous = case mc of
Just c -> makeTransparent c plane
Nothing -> plane