User:JRV

From HaskellWiki
Revision as of 14:04, 12 October 2009 by JRV (talk | contribs)
Jump to navigation Jump to search

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

<haskell>...</haskell>

gets haskell highlighting.

How do I get highlighting for, say, C?


{-# 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

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.