{-# LANGUAGE QuasiQuotes #-}
module CallingQuotes where

import Quasiquoter

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