Skip to content
GitLab
Projects
Groups
Snippets
/
Help
Help
Support
Community forum
Keyboard shortcuts
?
Submit feedback
Sign in / Register
Toggle navigation
Menu
Open sidebar
Ara Adkins
Glasgow Haskell Compiler
Commits
66908280
Commit
66908280
authored
Mar 08, 2003
by
panne
Browse files
[project @ 2003-03-08 23:03:47 by panne]
More markup fixes...
parent
f3fdb225
Changes
12
Hide whitespace changes
Inline
Side-by-side
libraries/base/Control/Concurrent.hs
View file @
66908280
...
...
@@ -113,8 +113,8 @@ doesn't make use of any operating system-supplied thread packages.
Haskell threads can communicate via 'MVar's, a kind of synchronised
mutable variable (see "Control.Concurrent.MVar"). Several common
concurrency abstractions can be built from 'MVar's, and these are
provided by the "Concurrent" library. Threads may also
communicate
via exceptions.
provided by the "
Control.
Concurrent" library. Threads may also
communicate
via exceptions.
-}
{- $conc_scheduling
...
...
@@ -308,7 +308,7 @@ nmergeIO lss
> return mvar
Note that we use 'finally' from the
"Exception" module to make sure that the
"
Control.
Exception" module to make sure that the
'MVar' is written to even if the thread dies or
is killed for some reason.
...
...
@@ -357,7 +357,7 @@ nmergeIO lss
The rescheduling timer runs on a 20ms granularity by
default, but this may be altered using the
@-i<n>@ RTS option. After a rescheduling
@-i
\
<n
\
>@ RTS option. After a rescheduling
\"tick\" the running thread is pre-empted as soon as
possible.
...
...
libraries/base/Control/Exception.hs
View file @
66908280
...
...
@@ -236,7 +236,7 @@ evaluate a = IO $ \s -> case a `seq` () of () -> (# s, a #)
-- 'mapException'
-- | This function maps one exception into another as proposed in the
-- paper "A semantics for imprecise exceptions".
-- paper
\
"A semantics for imprecise exceptions
\
".
-- Notice that the usage of 'unsafePerformIO' is safe here.
...
...
libraries/base/Data/Bits.hs
View file @
66908280
...
...
@@ -13,7 +13,7 @@
-- integers. Instances of the class 'Bits' for the 'Int' and
-- 'Integer' types are available from this module, and instances for
-- explicitly sized integral types are available from the
-- "Int" and "Word" modules.
-- "
Data.
Int" and "
Data.
Word" modules.
--
-----------------------------------------------------------------------------
...
...
libraries/base/Data/Ix.hs
View file @
66908280
...
...
@@ -10,9 +10,9 @@
--
-- Class of index types.
--
-- The
"
Ix
"
class is used to map a continuous subrange of values in a type onto
-- The
'
Ix
'
class is used to map a continuous subrange of values in a type onto
-- integers. It is used primarily for array indexing (see Section 6
-- <http://www.haskell.org/onlinelibrary/array.html#arrays>). The
"
Ix
"
-- <http://www.haskell.org/onlinelibrary/array.html#arrays>). The
'
Ix
'
-- class contains the methods range, index, and inRange. The 'index' operation
-- maps a bounding pair, which defines the lower and upper bounds of the range,
-- and a subscript, to an integer. The 'range' operation enumerates all
...
...
libraries/base/Foreign/C/Error.hs
View file @
66908280
...
...
@@ -9,7 +9,7 @@
-- Stability : provisional
-- Portability : portable
--
-- C-specific Marshalling support: Handling of C "errno" error codes
-- C-specific Marshalling support: Handling of C
\
"errno
\
" error codes
--
-----------------------------------------------------------------------------
...
...
libraries/base/Foreign/Ptr.hs
View file @
66908280
...
...
@@ -9,7 +9,7 @@
-- Stability : provisional
-- Portability : portable
--
-- Th
e "Ptr"
module provides typed pointers to foreign data. It is part
-- Th
is
module provides typed pointers to foreign data. It is part
-- of the Foreign Function Interface (FFI) and will normally be
-- imported via the "Foreign" module.
--
...
...
libraries/base/Foreign/Storable.hs
View file @
66908280
...
...
@@ -86,8 +86,8 @@ memory blocks. The class 'Storable' facilitates this manipulation on
all types for which it is instantiated, which are the standard basic
types of Haskell, the fixed size @Int@ types ('Int8', 'Int16',
'Int32', 'Int64'), the fixed size @Word@ types ('Word8', 'Word16',
'Word32', 'Word64'), 'StablePtr', all types from "
C
Types"
and
"CTypesISO",
as well as 'Ptr'.
'Word32', 'Word64'), 'StablePtr', all types from "
Foreign.C.
Types"
,
as well as 'Ptr'.
Minimal complete definition: 'sizeOf', 'alignment', one of 'peek',
'peekElemOff' and 'peekByteOff', and one of 'poke', 'pokeElemOff' and
...
...
libraries/base/GHC/IOBase.lhs
View file @
66908280
...
...
@@ -123,7 +123,7 @@ ioToST (IO m) = (ST m)
-- Unsafe IO operations
{-|
This is the "back door" into the 'IO' monad, allowing
This is the
\
"back door
\
" into the 'IO' monad, allowing
'IO' computation to be performed at any time. For
this to be safe, the 'IO' computation should be
free of side effects and independent of its environment.
...
...
libraries/base/GHC/Read.lhs
View file @
66908280
...
...
@@ -177,17 +177,17 @@ lexP :: ReadPrec L.Lexeme
lexP = lift L.lex
paren :: ReadPrec a -> ReadPrec a
-- ^ @(paren p)@ parses "(P0)"
-- where @p@ parses "P0" in precedence context zero
-- ^ @(paren p)@ parses
\
"(P0)
\
"
-- where @p@ parses
\
"P0
\
" in precedence context zero
paren p = do L.Punc "(" <- lexP
x <- reset p
L.Punc ")" <- lexP
return x
parens :: ReadPrec a -> ReadPrec a
-- ^ @(parens p)@ parses "P", "(P0)", "((P0))", etc,
-- where @p@ parses "P" in the current precedence context
-- parses "P0" in precedence context zero
-- ^ @(parens p)@ parses
\
"P
\
",
\
"(P0)
\
",
\
"((P0))
\
", etc,
-- where @p@ parses
\
"P
\
" in the current precedence context
-- parses
\
"P0
\
" in precedence context zero
parens p = optional
where
optional = p +++ mandatory
...
...
@@ -217,7 +217,7 @@ list readx =
choose :: [(String, ReadPrec a)] -> ReadPrec a
-- ^ Parse the specified lexeme and continue as specified.
-- Esp useful for nullary constructors; e.g.
-- @choose [("A", return A), ("B", return B)]@
-- @choose [(
\
"A
\
", return A), (
\
"B
\
", return B)]@
choose sps = foldr ((+++) . try_one) pfail sps
where
try_one (s,p) = do { L.Ident s' <- lexP ;
...
...
libraries/base/System/Console/GetOpt.hs
View file @
66908280
...
...
@@ -66,7 +66,7 @@ The arguments to 'Option' are:
* list of short option characters
* list of long option strings (without "--")
* list of long option strings (without
\
"--
\
")
* argument descriptor
...
...
@@ -262,7 +262,7 @@ test order cmdline = case getOpt order options cmdline of
{- $example
To hopefully illuminate the role of the different
"GetOpt"
data
To hopefully illuminate the role of the different data
structures, here\'s the command-line options for a (very simple)
compiler:
...
...
libraries/base/System/Random.hs
View file @
66908280
...
...
@@ -72,7 +72,7 @@ getClockTime = do t <- readtime nullPtr; return (TOD (toInteger t) ())
{- $intro
Th
e "Random"
library deals with the common task of pseudo-random
Th
is
library deals with the common task of pseudo-random
number generation. The library makes it possible to generate
repeatable results, by starting with a specified initial random
number generator; or to get different results on each run by using the
...
...
@@ -121,8 +121,8 @@ class RandomGen g where
-- default mathod
genRange
g
=
(
minBound
,
maxBound
)
{- |The "Random" library provides one instance of 'RandomGen', the
abstract data
type 'StdGen'.
{- |The "
System.
Random" library provides one instance of 'RandomGen', the
abstract data
type 'StdGen'.
The result of repeatedly using next should be at least as statistically robust
as the /Minimal Standard Random Number Generator/ described by
...
...
libraries/base/Text/ParserCombinators/ReadP.hs
View file @
66908280
...
...
@@ -9,11 +9,11 @@
-- Stability : provisional
-- Portability : portable
--
--
"ReadP"
is a library of parser combinators, originally written by Koen Claessen.
--
This
is a library of parser combinators, originally written by Koen Claessen.
-- It parses all alternatives in parallel, so it never keeps hold of
-- the beginning of the input string, a common source of space leaks with
-- other parsers. The '(+++)' choice combinator is genuinely commutative;
-- it makes no difference which branch is "shorter".
-- it makes no difference which branch is
\
"shorter
\
".
-----------------------------------------------------------------------------
...
...
Write
Preview
Supports
Markdown
0%
Try again
or
attach a new file
.
Cancel
You are about to add
0
people
to the discussion. Proceed with caution.
Finish editing this message first!
Cancel
Please
register
or
sign in
to comment