Sandbox
Feel free to edit as you wish on this page. It is here for you to experiment with WIKI edit syntax.
fooling around[edit]
import Control.Monad.State.Lazy |
import testm |
TADA! this is a link to google, surprisingly
Siers Fri Jun 27 02:36:37 EEST 2014
section[edit]
--Lars 11:14, 27 July 2009 (UTC)
Failed to parse (SVG (MathML can be enabled via browser plugin): Invalid response ("Math extension cannot connect to Restbase.") from server "https://wikimedia.org/api/rest_v1/":): {\displaystyle Insert formula here} Media:Example.oggFile:Example.jpg
Headline text[edit]
Italic textBold text
Pavillon | Uge | Uge |
Matrix:
- Failed to parse (SVG (MathML can be enabled via browser plugin): Invalid response ("Math extension cannot connect to Restbase.") from server "https://wikimedia.org/api/rest_v1/":): {\displaystyle \left[ \begin{matrix}1 & 2 \\ 3 & 4\end{matrix} \right]}
Embedded matrix:
- Failed to parse (SVG (MathML can be enabled via browser plugin): Invalid response ("Math extension cannot connect to Restbase.") from server "https://wikimedia.org/api/rest_v1/":): {\displaystyle \left[ \begin{matrix}1 & 2 \\ 3 & \left[ \begin{matrix}5 & 6 \\ 7 & 8\end{matrix}\right] \end{matrix} \right]}
Links[edit]
An internal link. To not exists page abcd. To exists page Haskell
External[edit]
http://cs.pdx.edu/~dick/HaskellSemantics/jpf05.pdf
http://cs.pdx.edu/~dick/HaskellSemantics/Haskell98.pdf
There is no appearance difference between dead link dead and live link live
Text taken from http://hpaste.org/3881: this wiki's syntax highlight at least does not garble the source, unlike hpaste's highlight.
An external link using text instead of the raw link address.
module Main where
import Prelude hiding (putStrLn, print)
import System.IO.UTF8
import Data.List (intersperse, find)
type Персонаж = String
type Персонажи = [Персонаж]
едоки :: Персонажи
едоки = [ "дедка", "бабка", "внучка", "жучка", "кошка", "мышка" ]
подходы :: [ Персонажи ]
подходы = scanl позвать [] едоки
where позвать тянущие подмога = подмога:тянущие
построились :: Персонажи -> [ (Персонаж, Персонаж) ]
построились едоки = zip едоки ("репка":едоки)
диспозиции = map (построились.reverse) подходы
описать [] = "Посадил дед репку ..."
описать диспозиция =
unwords ["Взялись:"
, concat $ intersperse ", " $ map за диспозиция
, ". Тянут-потянут -- " ++ result
]
where
за (кто,кого) = кто ++ " за " ++ винительный_падеж кого
винительный_падеж ы = init ы ++ "у"
result = case find ((=="мышка").fst) диспозиция of
Just _ -> "вытянули репку!"
Nothing -> "вытянуть не могут!"
main = mapM_ putStrLn $ map описать диспозиции
Section[edit]
Subsection[edit]
Subsubsection[edit]
huhu
Subsubsubsection[edit]
tables[edit]
basic table[edit]
Header 1 | Header 2 | Header 3 |
---|---|---|
row 1, cell 1 | row 1, cell 2 | row 1, cell 3 |
row 2, cell 1 | row 2, cell 2 | row 2, cell 3 |
Single Quote[edit]
https://github.com/ppelleti/haskell-wiki-bugs/issues/6
This seems to be fixed.
myLast :: [a] -> a
myLast [] = error "No end for empty lists!"
myLast [x] = x
myLast (_:xs) = myLast xs
myLast' = foldr1 (const id)
-- Prelude> const 1 2
-- 1
-- Prelude> (flip const) 1 2
-- 2
myLast'' = foldr1 (flip const)
myLast''' = head . reverse
myLast'''' = foldl1 (curry snd)
myLast''''' [] = error "No end for empty lists!"
myLast''''' x = x !! (length x -1)
haskelll code without syntax highlight (no '
problem)
-- import Prelude
import Data.List
import Data.Function
main :: IO ()
main = do
let xs = [(8,2),(3,2),(3,1),(10,2),(10,6)] :: [(Int,Int)]
print xs
let sortXs' = sort xs
print sortXs'
Another syntax highlighting example[edit]
import Control.Applicative
import Data.Bits
import Data.IORef
import Data.Word
ioDirA, iPolA, ioCon, gpPuA, gpioA, gpioB, olatA :: Word8
readReg16 :: ReadFunc -> Word8 -> IO Word16
readReg16 rf reg = word8sToWord16 <$> rf reg 2
data RomCode = RomA00 | RomA02
deriving (Eq, Ord, Show, Read, Bounded, Enum)
Exercises |
---|
|