This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
import Control.Applicative | |
import Control.Concurrent (forkIO, newEmptyMVar, putMVar, takeMVar) | |
import Control.Monad | |
import Control.Monad.Trans.Class | |
import Control.Monad.IO.Class | |
import System.Command | |
newtype Cmd m a = Cmd { runCmd :: m (Either (ExitCode, String) a) } | |
cmd :: MonadIO m => FilePath -> [String] -> String -> Cmd m String |
This file contains hidden or bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE EmptyDataDecls #-} | |
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE GADTs #-} | |
module Sublist (S, L, R, Sublist, sublistHead, sublistTail, fromSublist) where | |
import Control.Applicative ((<|>)) | |
import qualified Control.Lens as L | |
import Data.Maybe (fromMaybe) |
NewerOlder