Difference between revisions of "User:JRV"

From HaskellWiki
Jump to navigation Jump to search
(Got rid of draft tutorial)
 
(18 intermediate revisions by the same user not shown)
Line 1: Line 1:
== Testing MediaWiki markup==
 
 
This is a simple file to test whether I can compose offline with MacVim
 
and paste into my user page
 
 
== Some Haskell code==
 
 
Following is produced using <pre><code>...</code></pre> How do I get highlighting?
 
(and other code effects) -- tomorrow!
 
 
<code>
 
{-# LANGUAGE ForeignFunctionInterface #-}
 
 
module Safe where
 
 
import Foreign.C.Types
 
 
fibonacci :: Int -> Int
 
fibonacci n = fibs !! n
 
where fibs = 0 : 1 : zipWith (+) fibs (tail fibs)
 
 
fibonacci_hs :: CInt -> CInt
 
fibonacci_hs = fromIntegral . fibonacci . fromIntegral
 
 
foreign export ccall fibonacci_hs :: CInt -> CInt
 
 
</code>
 
 
== Some misc text ==
 
 
Here is some ''italic'' text.
 
 
== Special symbols ==
 
 
Well, I should be able to do this in vim, I'll try later
 
when I have time.
 

Latest revision as of 16:22, 2 November 2009