module System.Command.QQ.Predef where
import Language.Haskell.TH.Quote (QuasiQuoter)
import System.Command.QQ (interpreter, shell, quoter, callCommand)
bash :: QuasiQuoter
bash = shell "bash"
zsh :: QuasiQuoter
zsh = shell "zsh"
awk :: QuasiQuoter
awk = quoter $ callCommand "awk" []
ghci :: QuasiQuoter
ghci =
quoter $ callCommand "ghc" ["-ignore-dot-ghci", "-e"]
perl :: QuasiQuoter
perl = interpreter "perl"
ruby :: QuasiQuoter
ruby = interpreter "ruby"
python :: QuasiQuoter
python = shell "python"
python2 :: QuasiQuoter
python2 = shell "python2"
python3 :: QuasiQuoter
python3 = shell "python3"