{-# LANGUAGE QuasiQuotes #-}
module Main where

import QQ

main = putStrLn [myq|hello|]