# Top heading - Only multi-line comments are supported for Markdown - Haskell code snippet (use `hs`) ```hs "1+4+2+3" ``` - Console code snippet ```console "1*2*3*4" ``` 1. what's in comments is written as is 2. Haskell code becomes haskell code snippets - There should be a line between a multi-line comment and Haskell code - A Haskell snippet starts with a non-empty line that is not a part of a multi-line comment - Magic comments will be skipped - Haskell function docs won't - If there's a single line btw Haskell code and a comment, this line is removed the following two comments will be commented out due to a config ```haskell -- before a magic comment ``` ```haskell -- after a magic comment {-# LANGUAGE MultiParamTypeClasses #-} {-# LANGUAGE FlexibleContexts #-} {-# LANGUAGE FlexibleInstances #-} {-# OPTIONS_GHC -Wno-missing-kind-signatures #-} ``` ```haskell -- this comment will go into the Haskell snippet module Main where -- a comment after a1 :: Integer a1 = 4 ``` This comment will divide Haskell snippets ```haskell -- Imports a2 :: Integer a2 = 2 ``` ## Second-level heading some text ### Third-level heading ```haskell -- Text one -- this multiline comment should separate this line and the line after the comment {--} -- Text two should be ignored ``` - Indented block ```haskell -- Text three -- This comment will go into a Haskell snippet -- | This doc will go into a Haskell snippet class (Monoid (m a)) => Reducible m a where op :: m a -> Char -- | this too constr :: m a -> a -> m a -- | and this one get :: m a -> m a -> a ``` don't put anything outside and after this comment like in `{- -} -- hey` ```haskell -- a comment that will go into a snippet ``` ```haskell {-| some doc that will be in a snippet -} main :: IO () main = print "hi!" ``` 1 <- Some html {- LIMA_DISABLE -} in comments should read like {- LIMA_DISABLE -} ```haskell -- shouldn't be ignored ``` this LIMA_ENABLE reads like a comment because there's no corresponding preceding LIMA_DISABLE 1. listing ```haskell -- where's lorem ipsum blah? ``` ```haskell -- final comment ```