summaryrefslogtreecommitdiff
path: root/src/Sequence/Utils.hs
blob: 9fc0ab26fea12cfdba60947739ca42b3162bb87c (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
{-# LANGUAGE ViewPatterns, FlexibleContexts, MultiParamTypeClasses, FunctionalDependencies, FlexibleInstances, UndecidableInstances, OverloadedStrings #-}

module Sequence.Utils
  ( withArg, withFocus
  , toName
  , Argument(..)
  , Completion(..)
  , module Sequence.Utils.Ask
  ) where

import Sequence.Types

import Control.Monad.State.Strict

import Control.Applicative
import Control.Monad
import Control.Lens

import Data.Bimap (Bimap)
import qualified Data.Bimap as Bimap

import Data.CaseInsensitive (CI)
import qualified Data.CaseInsensitive as CI

import Data.Map.Strict (Map)
import qualified Data.Map.Strict as Map

import Data.Function
import Data.Default
import Data.Maybe
import Text.Read (readMaybe)

import Data.List
import Data.Bool

import System.Console.Shell
import System.Console.Shell.ShellMonad
import System.Console.Shell.Backend.Haskeline

import Sequence.Utils.Ask

class Argument a st | a -> st where
  arg :: String -> Sh st (Maybe a)

withArg :: Argument a st => (a -> Sh st ()) -> (Completable a -> Sh st ())
withArg f (Completable str) = arg str >>= \a -> case a of
  Nothing -> shellPutErrLn $ "Could not parse ‘" ++ str ++ "’"
  Just a  -> f a

withFocus :: (EntityIdentifier -> Sh GameState ()) -> Sh GameState ()
withFocus f = use gFocus >>= \focus -> case focus of
  Nothing -> shellPutErrLn $ "Currently not focusing any entity"
  Just id -> f id

unaligned = view faction' def

toName :: MonadState GameState m => EntityIdentifier -> m String
toName ident = do
  let number = review entityId' ident
  isShadowed <- uses gEntityNames . Bimap.memberR $ view entityName number
  let number' = bool id ('#':) isShadowed $ number
  fromMaybe number' . fmap (review entityName) . Bimap.lookup ident <$> use gEntityNames

instance Completion EntityIdentifier GameState where
  completableLabel _ = "<entity>"
  complete _ st prefix = return . filter ((isPrefixOf `on` CI.foldCase) prefix) . map ((evalState ?? st) . toName) . Map.keys $ st ^. gEntities

instance Argument EntityIdentifier GameState where
  arg = \str -> do
    fromForcedIdR <- fromForcedId str
    fromNameR <- fromName str
    fromIdR <- fromId str
    return $ fromForcedIdR <|> fromNameR <|> fromIdR
    where
      fromName (EntityName . CI.mk -> name) = Bimap.lookupR name <$> use gEntityNames
      fromId (preview entityId' -> Just n) = (n <$) . guard . Map.member n <$> use gEntities
      fromId _ = return Nothing
      fromForcedId ('#':str) = fromId str
      fromForcedId _ = return Nothing

instance Completion Faction GameState where
  completableLabel _ = "<faction>"
  complete _ st prefix = return . filter ((isPrefixOf `on` CI.foldCase) prefix) . nub . sort $ unaligned : map (view faction') (st ^. inhabitedFactions)

instance Argument Faction GameState where
  arg = return . Just . flip (set faction') def