module EndOfExe where
import qualified System.Directory as D (findExecutable)
import Data.Maybe (isJust)
import System.IO.Unsafe (unsafePerformIO)
endOfExecutable :: String -> IO String
endOfExecutable ys = do
xs <- D.findExecutable ys
if isJust xs
then return ""
else do
zs <- D.findExecutable (ys ++ ".exe")
if isJust zs
then return ".exe"
else error ("Please, install the executable " ++ ys ++ " into the directory in the PATH variable!")
showE :: String -> String
showE xs | null xs = []
| otherwise = xs ++ unsafePerformIO (endOfExecutable xs)