tweag / HaskellR

The full power of R in Haskell.

Home Page:https://tweag.github.io/HaskellR

Geek Repo:Geek Repo

Github PK Tool:Github PK Tool

0.10.1 hangs on MACOS

idontgetoutmuch opened this issue · comments

Running main hangs in ghci on MACOS 10.13.2 with 0.10.1 but not with 0.9.2. For 0.9.2 I have the following in the .yaml for stack:

  - inline-r-0.9.2
  - vector-0.12.0.1
  - inline-c-0.6.1.0
{-# OPTIONS_GHC -Wall #-}

{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE QuasiQuotes #-}

module Main (main) where

import qualified Language.R as R
import Language.R.QQ


main = do
  let temps10 :: [Double]
      temps10 = [22.0,22.0,23.0,23.0,23.0,23.0,23.0,24.0,24.0,24.0]
      tods10 :: [Double]
      tods10 = [6704.0,6709.0,6715.0,6727.0,6732.0,6736.0,6742.0,6750.0,6757.0,6759.0]
  R.runRegion $ do
    df <- [r| data.frame(time = tods10_hs, val = temps10_hs) |]
    return ()

Let me know if you need anything else.

I have re-installed ghc and this no longer seems to happen. Also I now seem to be able to use 0.10.1.