[Haskell-cafe] Can't derive Binary for StdGen

Grigory Sarnitskiy sargrigory at ya.ru
Thu Aug 20 11:05:30 EDT 2009


Hello! I'm trying to derive Binary for StdGen with DrIFT:

module Main where

import System.Random
import Data.Binary

{-!for StdGen derive : Binary !-}

data Foo = Foo StdGen StdGen deriving (Show) {-! derive : Binary !-}

but I got  error  "DrIFT: can't find module System/Random"
What shall I do?


More information about the Haskell-Cafe mailing list