module Language.PureScript.Interactive.Directive where
import Prelude.Compat
import Data.Maybe (fromJust, listToMaybe)
import Data.List (isPrefixOf)
import Data.Tuple (swap)
import Language.PureScript.Interactive.Types
directives :: [Directive]
directives = map fst directiveStrings
directiveStrings :: [(Directive, [String])]
directiveStrings =
    [ (Help   , ["?", "help"])
    , (Quit   , ["quit"])
    , (Reset  , ["reset"])
    , (Browse , ["browse"])
    , (Type   , ["type"])
    , (Kind   , ["kind"])
    , (Show   , ["show"])
    , (Paste  , ["paste"])
    ]
directiveStrings' :: [(String, Directive)]
directiveStrings' = concatMap go directiveStrings
  where
  go (dir, strs) = map (\s -> (s, dir)) strs
strings :: [String]
strings = concatMap snd directiveStrings
stringsFor :: Directive -> [String]
stringsFor d = fromJust (lookup d directiveStrings)
stringFor :: Directive -> String
stringFor = head . stringsFor
directivesFor' :: String -> [(Directive, String)]
directivesFor' str = go directiveStrings'
  where
  go = map swap . filter ((str `isPrefixOf`) . fst)
directivesFor :: String -> [Directive]
directivesFor = map fst . directivesFor'
directiveStringsFor :: String -> [String]
directiveStringsFor = map snd . directivesFor'
parseDirective :: String -> Maybe Directive
parseDirective = listToMaybe . directivesFor
hasArgument :: Directive -> Bool
hasArgument Help = False
hasArgument Quit = False
hasArgument Reset = False
hasArgument Paste = False
hasArgument _ = True
help :: [(Directive, String, String)]
help =
  [ (Help,    "",         "Show this help menu")
  , (Quit,    "",         "Quit PSCi")
  , (Reset,   "",         "Discard all imported modules and declared bindings")
  , (Browse,  "<module>", "See all functions in <module>")
  , (Type,    "<expr>",   "Show the type of <expr>")
  , (Kind,    "<type>",   "Show the kind of <type>")
  , (Show,    "import",   "Show all imported modules")
  , (Show,    "loaded",   "Show all loaded modules")
  , (Paste,   "paste",    "Enter multiple lines, terminated by ^D")
  ]