[Haskell-cafe] Coding Standards (Coding Conventions)

2007-05-28 Thread Philipp Volgger
I wonder if there are any Coding Standards or Coding Conventions for 
Haskell. Does anybody know something about it?


Kind regards,
Philipp Volgger

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Random idea

2007-05-20 Thread Philipp Volgger


For me it gives:
 1 + 1
Maybe you meant: . v

But the rest of the commands seems working ;)



Andrew Coppin schrieb:

Rodrigo Queiro wrote:

http://lambdabot.codersbase.com/


Wait, what the hell...?


 1 + 1
/usr/lib/ghc-6.4.2/package.conf: openFile: does not exist (No such 
file or directory)


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Problems with Hs-Plugins

2007-05-05 Thread Philipp Volgger

I tried following very simple program:

module Main where
import System.Eval.Haskell

main = do i - eval 1 + 6 :: Int [] :: IO (Maybe Int)
  if isJust i then putStrLn (show (fromJust i)) else return ()

I compile it with ghc -c Main.hs and everything seems fine.
When I run it with ghc Main.o I get following message:
Main.o(.text+0x48):fake: undefined reference to 
`AltDataziTypeable_zdfTypeableInt_closure'
Main.o(.text+0x4d):fake: undefined reference to 
`SystemziEvalziHaskell_eval_closure'
Main.o(.text+0x36f):fake: undefined reference to 
`__stginit_SystemziEvalziHaskell_'
Main.o(.rodata+0x0):fake: undefined reference to 
`SystemziEvalziHaskell_eval_closure'
Main.o(.rodata+0x4):fake: undefined reference to 
`AltDataziTypeable_zdfTypeableInt_closure'

collect2: ld returned 1 exit status

When I run it with runhaskell Main I get:



GHCi runtime linker: fatal error: I found a duplicate definition for 
symbol

   _GHCziWord_fromEnum1_closure
whilst processing object file
   c:/ghc/ghc-6-4-2/ghc-6.4.2/HSbase1.o
This could be caused by:
   * Loading two different object files which export the same symbol
   * Specifying the same object file twice on the GHCi command line
   * An incorrect `package.conf' entry, causing some object to be
 loaded twice.
GHCi cannot safely continue in this situation.  Exiting now.  Sorry.

So I did probably something totally wrong, but what?


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Is Hs-Plugins dead?

2007-05-01 Thread Philipp Volgger
Is Hs-Plugins still under develeopment; is there still somebody who is 
updating it?



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] FIT for Haskell

2007-04-30 Thread Philipp Volgger
Who wrote FIT for Haskell on http://darcs.haskell.org/FIT/? Does anybody 
know if the version is stable?

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] IDE support

2007-04-22 Thread Philipp Volgger
What IDE support is available for Haskell (Visuall Haskell, EclipseFP), 
anything else?



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Installation of hs-plugins

2007-04-21 Thread Philipp Volgger
I now used GHC 6.4 and mingw ( MSYS-1.0.11 ). Now it is possible to 
configure, build and install it. But on running the test ( out of a 
email from the list, source code see below) it crashes again without any 
information.

I compiled the Test1.hs with ghc -c Test1.hs.


Bayley, Alistair wrote:
From: [EMAIL PROTECTED] 
[mailto:[EMAIL PROTECTED] On Behalf Of Philipp Volgger


could somebody please tell me how hs-plugins has to be installed. I 
tried it with hs-plguin 1.0rc1 and I was unable to build it. I did

runhaskell Setup.lhs configure
runhaskell Setup.lhs build   (Crash without any information)
I tried it wiht GHC 6.4, 6.4.1 and 6.6.

I am using Windows XP with SP2.



I'm pretty sure you need to install under some kind of bash shell. I
used mingw on WinXP, but I think it can be done with cygwin. I'd
recommend mingw if you don't have either installed.

Note that hs-plugins doesn't work with ghc-6.6 yet on Windows, so stick
with 6.4.1 if you can.

Alistair
*
Confidentiality Note: The information contained in this message,
and any attachments, may contain confidential and/or privileged
material. It is intended solely for the person(s) or entity to
which it is addressed. Any review, retransmission, dissemination,
or taking of any action in reliance upon this information by
persons or entities other than the intended recipient(s) is
prohibited. If you received this in error, please contact the
sender and delete the material from any computer.
*

  


Test:

module Test1 where
test1 = putStrLn test1


module Main where
import Prelude hiding (catch)
import Control.Exception
import Data.List
import System.Environment
import System.Plugins

instance Show (LoadStatus a) where
 show (LoadFailure errors) = LoadFailure -  ++ (concat (intersperse
\n errors))
 show (LoadSuccess m p) = LoadSuccess

main = do
 a - getArgs
 let
   modName = case a of
 (n:_) - n
 _ - Test1
 let modPath = ./ ++ modName ++ .o
 let method = test1
 fc - catch (load modPath [] [] method)
   (\e - return (LoadFailure
 [Dynamic loader returned:  ++ show e]))
 case fc of
   LoadFailure errors - do
 fail (concat (intersperse \n errors))
   LoadSuccess modul proc - do
 let p :: IO (); p = proc
 proc


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Installation of hs-plugins

2007-04-20 Thread Philipp Volgger

Hello everybody,

could somebody please tell me how hs-plugins has to be installed. I 
tried it with hs-plguin 1.0rc1 and I was unable to build it. I did

   runhaskell Setup.lhs configure
   runhaskell Setup.lhs build   (Crash without any information)
I tried it wiht GHC 6.4, 6.4.1 and 6.6.

I am using Windows XP with SP2.
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Function call by string

2007-04-08 Thread Philipp Volgger

Hello everybody!
Can me somebody say how I can call a function by string? Thus I want to 
have a function that has as argument a string (name of a function to 
call) and then tries to call that function, a kind of:


functionCall :: String - [String] - RetVal
functionCall functionName arguments = ...

Thanks
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Function call by string

2007-04-08 Thread Philipp Volgger
Well, the Haskell files are not the problem, they don't have to be built 
automatically. The point is that I want to call functions in a Haskell 
function if I get their names as strings. Isn't there any possibilty to 
do that? Eventually the interpreter reads also the console in to execute 
the input. Maybe it will be the best to look there (interpreter code of 
GHCi)


Thank you :)

Lennart Augustsson schrieb:
It sounds like you need to generate some kind of Haskell stubs given 
the Java signatures.


On Apr 8, 2007, at 11:16 , Philipp Volgger wrote:

Well my problem is the following. I try to make Haskell work with FIT 
for Java. I would like to have a 1-to-1 corresondence between the 
Java methods and the functions in the corresponding module in 
Haskell, thus they would have to have the same name and 
arguments/parameters. From Java I could then run the Haskell Code (by 
a Server), but I would like to have the possiblity to name the 
module, the functionname and so on.



Lennart Augustsson schrieb:
In general, you can't do that.  You can only do it if you restrict 
the functions that can be called somehow, e.g., by having a list of 
callable functions and their names.


Why do you want to do this?  Perhaps there is a more Haskelly 
solution to your problem.


-- Lennart

On Apr 8, 2007, at 11:01 , Philipp Volgger wrote:


Hello everybody!
Can me somebody say how I can call a function by string? Thus I 
want to have a function that has as argument a string (name of a 
function to call) and then tries to call that function, a kind of:


functionCall :: String - [String] - RetVal
functionCall functionName arguments = ...

Thanks
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe








___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe