Difference between revisions of "User:JRV"

From HaskellWiki
Jump to navigation Jump to search
Line 6: Line 6:
 
== Some Haskell code==
 
== Some Haskell code==
   
Following is produced using <pre><code>...</code></pre> How do I get highlighting?
+
Following is produced using <pre><haskell>...</haskell></pre> gets haskell highlighting.
  +
How do I get highlighting for, say, C?
(and other code effects) -- tomorrow!
 
   
  +
<code>
 
  +
<haskell>
 
{-# LANGUAGE ForeignFunctionInterface #-}
 
{-# LANGUAGE ForeignFunctionInterface #-}
 
 
Line 25: Line 26:
 
foreign export ccall fibonacci_hs :: CInt -> CInt
 
foreign export ccall fibonacci_hs :: CInt -> CInt
   
</code>
+
</haskell>
   
 
== Some misc text ==
 
== Some misc text ==

Revision as of 14:04, 12 October 2009

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.