Difference between revisions of "User:JRV"

From HaskellWiki
Jump to navigation Jump to search
Line 1: Line 1:
 
== Testing MediaWiki markup==
 
== Testing MediaWiki markup==
   
  +
I'm new at this, and I thought I'd use this page to test some things I want to use in
This is a simple file to test whether I can compose offline with MacVim
 
  +
a Wiki article.
and paste into my user page
 
  +
 
First, can I can compose offline with MacVim
 
and paste into my user page. The answer to this is yes.
   
 
== Some Haskell code==
 
== Some Haskell code==
Line 36: Line 39:
 
Well, I should be able to do this in vim, I'll try later
 
Well, I should be able to do this in vim, I'll try later
 
when I have time.
 
when I have time.
  +
  +
==Links to other pages==
  +
The place that got me started toward this is [[Calling_Haskell_from_C| Calling Haskell from C]].

Revision as of 16:46, 12 October 2009

Testing MediaWiki markup

I'm new at this, and I thought I'd use this page to test some things I want to use in a Wiki article.

First, can I can compose offline with MacVim and paste into my user page. The answer to this is yes.

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.

Links to other pages

The place that got me started toward this is Calling Haskell from C.