There is a postdoc opening in my group for work on probabilistic
programming languages. Connections with Haskell are strong, and
several members of our team are building prototypes in Haskell.
I'd welcome applications from scientists with skills or interests
in Haskell.
Norman R
> I'm currently using Neil Mitchell's cmdargs package [1]. How does your
> package compare to that?
Hi Simon,
If you're using cmdargs and you're happy with it, you should certainly
stick with it, as it certainly has many capabilities that multiarg does
not, as well as being much better tested :)
multiarg is a parser combinator library to build command line parsers.
With it you can easily create parsers with options that take more than
one option argument--for example, I created multiarg due to the apparent
lack of such ability amongst other parsers. Its basic design is loosely
inspired by
ns too! The situation is simpler
because the only *interesting* infinite ascending chains are in
function domains.
To paraphrase, is what you're saying that the definition of a Haskell
type is the smallest fixed point that contains the bottom element
(divergent computation) as a
ents, corrections, and cues about good papers are all cheerfully solicited!
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
> > Allow (registered?) users to submit links to papers that are missing?
>
> Yeah, I've certainly been thinking about that.
> First, I will somehow have to overcome being a complete control freak.
>
> The very first thought that crosses my mind is
> "how will I ensure that author names ar
ard to using the new standard!
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
This is from GHC. Does anybody know a compiler option or other trick
that will coax the compiler into producing a Show instance.
(I know I can write one by hand, but I'd rather not bother.)
Norman
___
Haskell mailing list
Haskell@haskell.org
ell 98
report says it should not).
How can I refer to a symbolic name defined in a module imported by
`import qualified`?
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
ively),
and the the third, while it opens with a nice example, is primarily
about the (now obsolete) type-inference algorithm, rather than about
how to use GADTs.
I am hoping some of you may have suggestions about other papers that
would be good tutorials in the use of
I fear that without seeing some
formalism I can't be too sure what's going on---is there a technical
report somewhere that explains the distinction?
In any case, I hope this question is orthogonal to the problem of
permitting a type declaration as a 'decl' in a where claus
up the idea of writing a shell using
GHC and the classic Unix system calls fork/exec/close/pipe?
Or if it is possible after all, in what module should I be looking for
the proper abstractions?
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
Fidelis and I can think about adding some sort of audit trail that
would make it possible undo all trainings done by a given user, for
example.
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
only be beyond the
> search depth does tell you something (eg. the expected witness might be
> a position in a list where the search depth is the length of the list).
Indeed so.
Now if only I could find time to adapt QuickCheck and/or SmallCheck to
generate unit tests for C code (I'
ure, the first tells you something definite about your
program. And like passing 100 tests, the second tells you nothing.
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
a pity, as almost all the QuickCheck machinery would be
useful in such a search. On the other hand there are similar
scenarios on which I've already given up in despair, such as writing a
generator for creating well-typed terms in a nontrivial language.
Anyway, than
isfies not (lo + epsilon <= x <= hi - epsilon).
I'm betting someone on this list has already thought about similar
problems and can advise me. (Because I have yet to write the
specialized instance declaration for Arbitrary that guarantees the
num
> On Fri, Aug 22, 2008 at 02:46, Norman Ramsey <[EMAIL PROTECTED]> wrote:
> > In Fall 2006 I gave a graduate course in advanced functional programming
> > in which the default project was a compiler from a functional language of
> > the student's own design to
target. Also not clear how you
plan to deal with memory management---if you have first-class, nested
functions in the source language, you pretty much have to have a
garbage collector. If I were in your shoes, these are the questions
I'd be thinking about.
Norman
__
page but I'm sorry to say it's ML code :-(
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
4-bit fingerprints,
polynomial chosen by (literally) flipping a coin
http://citeseer.ist.psu.edu/broder93some.html
- Andrei's paper on applications of fingerprinting
How does laziness play into this problem? If you don't mind building
up a lot of thunks, you can probably ju
> If so, try working around the monomorphism restriction by changing
> from a pattern binding to a function binding.
>
> fold f = foldRegsUsed f
Brilliant. I hadn't known about the monomorphism restriction.
Now I know it's a 'necessa
= fold f (fold f z addr)
rval
middle (MidUnsafeCall tgt _ress args) = fold f (fold f z tgt) args
middle (CopyIn _ _formals _) = z
middle (CopyOut _ actuals) = fold f z actuals
fold = foldRegsUsed
What rule of the language have
no point in my writing the
following:
>load fn = do handle <- IO.openFile fn IO.ReadMode
> contents <- IO.hGetContents handle
> let xml = XP.xmlParse fn contents
> IO.hClose handle
> return xml
Is that correct?
IO String' instead
of 'FilePath -> IO String'. Dunno if this is a bug or a feature,
since as far as the compiler is concerned, FilePath and String are the
same type...
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
rsion 1.13.2-5 as distributed by Debian,
with GHC 6.6.
Does anyone have thoughts or suggestions? Is there software I should
prefer to HaXml? (I notice that HaXml does not understand XML Schema,
which I seem to be stuck with...)
Norman
___
ible to write an explicit
type-lambda in the term language as well, but because Haskell does not
lexically distinguish term variables from type variables, I can't
imagine a convenient syntax.
Norman
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
hich gets this right, is
fun 'a foo (x:'a) y = (x + 1, (y:'a))
and as might be expected, this declaration is vigorously rejected by
the type checker. As it damn well ought to be.
Thanks for the pointers to the new GHC rules.
Maybe one day I will learn
> Norman Ramsey wrote:
>
> > compile1 :: (Builder b box) => t -> Name -> Ir.ANF -> b t
> > compile1 f x body = do env <- compile body empty
> > wire (Arg W) (env x)
> > return f
> > c
. If I *remove* this type signature, the function
compiles successfully, and ghci reporets this type for compile1:
compile1 :: (Builder t box) => t1 -> Name -> Ir.ANF -> t t1
I believe this signature is isomorphic to the explicit signature I had
attempted to use.
Am I misusing the type-cl
The University is committed to equality of opportunity.
--
--
Norman PatersonSenior Scientific Officer
School of Computer Science http://www.dcs.st-and.ac.uk/~norman/
University of St Andrews Tel +44 (0) 1334 4
construction.
Detailed information about School can be found at
http://www.dcs.st-and.ac.uk/
Ron Morrison
Closing date 28-Apr-2004.
--
--
Norman Paterson Senior Scientific Officer; Purchase Officer
School of Computer Science http://www.dcs.st-and.ac.uk/~norman/
University of
the reasons I'm interested in a functional data structure
is that I believe I'm paying a lot for all the mutation I'm doing.)
Pointers to papers are code are also very welcome.
Norman
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell
remely mystified by such functions---and I can hardly
blame them! Is there a good place to read about programming with lazy
evaluation that will cover such functions and when to use them?
Norman
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.haske
/ghc-5.02.2/imports/util/QuickCheck
can't find module `/usr/lib/ghc-5.02.2/imports/util/QuickCheck'
Prelude>
Any advice, anyone?
Norman
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell
Faxen's static semantics be a good
place to start? Jones's `Typing Haskell in Haskell'? One of Phil
Wadler's papers (which one)?
Thanks again for any help,
Norman
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.
> > In a fit of madness, I have agreed to deliver a 50-minute lecture
> > on type classes to an audience of undergraduate students. These
> > students will have seen some simple typing rules for F2 and will
> > have some exposure to Hindley-Milner type inference in the context
> > of ML.
>
e
I'm especially in need of a guide to the literature, as
the `Haskell bookshelf' at haskell.org is silent on the topic
of type classes.
Please send me your recommendations.
Norman Ramsey
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.hask
tion about the proper input format?
Norman
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell
> On 09-Jul-2001, Norman Ramsey <[EMAIL PROTECTED]> wrote:
> > I'm trying to model probability and leave the
> > representation of probability unspecified other than
> > it must be class Real. But I'm having trouble with
> > random numbers; h
other than by changing the library?
Norman
___
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell
` Value.Sym s :@: 1.0]
Hugs reports:
ERROR "finterp.lhs" (line 10): Definition of variable "exp" clashes with import
But there is no explicit `exp' in any of my other modules:
: nr@labrador 1337 ; grep -w exp *.lhs
finterp.lhs:> exp (Sym s) = Vee [result `eq` Value
ght.
> data Formula f => Row a = Row (f a, Weight)
> type Weight = Float
Hugs rejects this program:
ERROR "hard.lhs" (line 14): Undefined type variable "f"
Line 14 is the definition of Row. Can anyone explain the proper
use of a context in a data definition?
> > Does anybody know of work using monads to encapsulate a source of
> > random numbers?
> Is the global random number generator, in section 17.3 of the Haskell
> 98 library report, the sort of thing you're after?
No; that appears to embed a generator in the IO monad.
Not what I'd hope
Does anybody know of work using monads to encapsulate a source of
random numbers? A quick web search suggested Haskell 98 did not take
this path. I'd be curious for any insights why, or any suggestions
about a `randomness monad'.
Norman
than ample qualification for
the position, and once we have the new compiler, the very first thing
we want to do is target GHC to it---so there is a Haskell connection.
I hope you or a friend may be interested in this position.
Norman
Staff Position / Programming Languages and Compilers
:: a -> (b,a)
...
which is clearly quite different. Shouldn't allow a context?
-Norman
---
Messing about with signature files fills a much-needed gap in the working
day.
In the Report 1.2 on page 98, in the definition of rationalToRealFloat, the
line beginning "where y" has unbalanced parentheses.
-Norman
---
Messing about with signature files fills a much-needed gap in the working
day.
if we remove the syntactic sugar first we get
(negate a) * b
Perhaps the point could be resolved by clarifying how the sugar is to be
removed.
-Norman
---
Messing about with signature files fills a much-needed gap in the working
day.
xts other than the top level (ie in "where"
or "let" constructs). Is this the case? If so, how is the ambiguity
resolved? Should the sentence begin, "Successor pattern bindings are
explicitly disallowed?"
-Norman Paterson
nce, so I was a bit sad to discover this.
Especially since I don't think of pattern binding as being a special
case of function definition.
Norm
--
Norman GrahamOklahoma State University
Domain: [EMAIL PROTECTED] Department of Computer Science
BangPath:
51 matches
Mail list logo