{-# LANGUAGE QuasiQuotes #-} import RlangQQ x = [0 .. 10 :: Double] y = map (sin . (*pi) . (/10)) x main = do [r| library(ggplot2) print('blahh') png(file='test.png') plot(qplot( hs_x, hs_y )) dev.off() |]