Send Beginners mailing list submissions to
        beginners@haskell.org

To subscribe or unsubscribe via the World Wide Web, visit
        http://mail.haskell.org/cgi-bin/mailman/listinfo/beginners
or, via email, send a message with subject or body 'help' to
        beginners-requ...@haskell.org

You can reach the person managing the list at
        beginners-ow...@haskell.org

When replying, please edit your Subject line so it is more specific
than "Re: Contents of Beginners digest..."


Today's Topics:

   1.  Invoking ghci with hackage modules (Lists0)
   2. Re:  Invoking ghci with hackage modules (Sylvain Henry)


----------------------------------------------------------------------

Message: 1
Date: Thu, 16 Jun 2022 01:39:03 +0200
From: Lists0 <lis...@freea2a.de>
To: beginners@haskell.org
Subject: [Haskell-beginners] Invoking ghci with hackage modules
Message-ID: <20220616012615.3072c94c@duin>
Content-Type: text/plain; charset=UTF-8


Hi all,

a very basic question, that I cannot solve alone:
How do I load modules from hackage into ghci ?
Say, I have a module arrows.hs : 

{-# LANGUAGE Arrows #-}

module Main where
import Control.Arrow
import Control.Monad
import qualified Control.Category as Cat
import Data.List
import Data.Maybe
import System.Random


I get the error in ghci:

% ghci arrows.hs
GHCi, version 8.10.6: https://www.haskell.org/ghc/  :? for help
[1 of 1] Compiling Main             ( arrows.hs, interpreted )

arrows.hs:9:1: error:
    Could not find module ‘System.Random’
    Use -v (or `:set -v` in ghci) to see a list of the files searched
for. |
9 | import System.Random
  | ^^^^^^^^^^^^^^^^^^^^
Failed, no modules loaded.
Prelude> 


System.Random is in the package "random" from hackage, where the other
modules are in the package base.

I cannot find a solution in the doku that works :-(

Thanks for help!



------------------------------

Message: 2
Date: Thu, 16 Jun 2022 08:52:03 +0200
From: Sylvain Henry <sylv...@haskus.fr>
To: <beginners@haskell.org>
Subject: Re: [Haskell-beginners] Invoking ghci with hackage modules
Message-ID: <9f110887-8ec7-8d21-30b7-e25bf262e...@haskus.fr>
Content-Type: text/plain; charset="UTF-8"; format=flowed

Hi,

With Stack:

 > stack ghci --resolver=lts-18.28 --package=random arrows.hs

You can use Stack's script feature to specify resolver and packages 
directly in the .hs file. See 
https://www.wespiser.com/posts/2020-02-02-Command-Line-Haskell.html for 
some examples.

Cheers,
Sylvain


On 16/06/2022 01:39, Lists0 wrote:
> Hi all,
>
> a very basic question, that I cannot solve alone:
> How do I load modules from hackage into ghci ?
> Say, I have a module arrows.hs :
>
> {-# LANGUAGE Arrows #-}
>
> module Main where
> import Control.Arrow
> import Control.Monad
> import qualified Control.Category as Cat
> import Data.List
> import Data.Maybe
> import System.Random
>
>
> I get the error in ghci:
>
> % ghci arrows.hs
> GHCi, version 8.10.6: https://www.haskell.org/ghc/  :? for help
> [1 of 1] Compiling Main             ( arrows.hs, interpreted )
>
> arrows.hs:9:1: error:
>      Could not find module ‘System.Random’
>      Use -v (or `:set -v` in ghci) to see a list of the files searched
> for. |
> 9 | import System.Random
>    | ^^^^^^^^^^^^^^^^^^^^
> Failed, no modules loaded.
> Prelude>
>
>
> System.Random is in the package "random" from hackage, where the other
> modules are in the package base.
>
> I cannot find a solution in the doku that works :-(
>
> Thanks for help!
>
> _______________________________________________
> Beginners mailing list
> Beginners@haskell.org
> http://mail.haskell.org/cgi-bin/mailman/listinfo/beginners


------------------------------

Subject: Digest Footer

_______________________________________________
Beginners mailing list
Beginners@haskell.org
http://mail.haskell.org/cgi-bin/mailman/listinfo/beginners


------------------------------

End of Beginners Digest, Vol 165, Issue 1
*****************************************

Reply via email to