{-# LANGUAGE Haskell2010 #-}
{-# LANGUAGE QuasiQuotes #-}
module UsingQuasiquotes where

import Quasiquoter

baz :: [Char]
baz  = [Char]
[string| foo bar |] [Char] -> [Char] -> [Char]
forall a. [a] -> [a] -> [a]
++ [Char]
[string| some
  mulitline
  quasiquote
|]