[Haskell] package with ghc and ghci
Simon Marlow
simonmar at microsoft.com
Tue Nov 16 11:27:19 EST 2004
[ moved to glasgow-haskell-users at haskell.org ]
On 16 November 2004 07:51, Fred Nicolier wrote:
> I have some packages for doing signal and image processing stuff.
> Here is a little test program :
>
> \begin{code}
> module Main where
> import Hips
> a = listSignal (1,10) [1..10]
> b = liftSignals (:+) a a
> c = fft b
> main = do
> putStrLn $ show a
> putStrLn $ show b
> putStrLn $ show c
> \end{code}
>
> 1/ Compiled with : ghc -package hips testFFT.hs
> 2/ interpreted with : ghci-package hips testFFT.h
>
> 1/ no problem
> 2/ dont execute and gives 'unknown package name: =Numeric' (Numeric is
> another package called by Hips, included in HaskellDSP).
Please send the output of command (2) with -v added to the command line.
Cheers,
Simon
More information about the Glasgow-haskell-users
mailing list