GHC and GSL

Adrian Victor Crisciu acrisciu at gmail.com
Mon Jul 22 15:38:46 CEST 2013


Hi,

I need to import in one of my programs the minimization module form
Numeric.GSL.Minimization. When I run even the example code in interactive
mode, ghci crashes with a "Bus error" message. Is this a bug, or is
something wrong with my code?

The offending program follows:

module MinMaxTest where

import Numeric.GSL.Minimization

objFunc :: [Double] -> Double
objFunc [x, y] = 10 * (x-1)^2 + 20 * (y-2)^2 + 30

main :: IO ()
main = do
    let (s, p) = minimize NMSimplex2 1e-2 30 [1, 1] objFunc [5, 7]
    print s
    print p

I use ghc-7.6.3 on a Slackware-Linux platform.

Can anyone help?

Thank you in advance.
Adrian-Victor
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://www.haskell.org/pipermail/glasgow-haskell-users/attachments/20130722/3d84c831/attachment.htm>


More information about the Glasgow-haskell-users mailing list