Skip to content
Snippets Groups Projects
Commit c4b13113 authored by Hécate Moonlight's avatar Hécate Moonlight Committed by Marge Bot
Browse files

Use "module" instead of "library" when applicable in base haddocks

parent 1e84b924
No related branches found
No related tags found
No related merge requests found
Showing
with 20 additions and 20 deletions
...@@ -147,7 +147,7 @@ by using 'forkOS' instead of 'forkIO'. ...@@ -147,7 +147,7 @@ by using 'forkOS' instead of 'forkIO'.
Haskell threads can communicate via 'MVar's, a kind of synchronised Haskell threads can communicate via 'MVar's, a kind of synchronised
mutable variable (see "Control.Concurrent.MVar"). Several common mutable variable (see "Control.Concurrent.MVar"). Several common
concurrency abstractions can be built from 'MVar's, and these are concurrency abstractions can be built from 'MVar's, and these are
provided by the "Control.Concurrent" library. provided by the "Control.Concurrent" module.
In GHC, threads may also communicate via exceptions. In GHC, threads may also communicate via exceptions.
-} -}
...@@ -384,7 +384,7 @@ foreign import ccall safe "fdReady" ...@@ -384,7 +384,7 @@ foreign import ccall safe "fdReady"
multiple Haskell threads can be involved in external calls multiple Haskell threads can be involved in external calls
simultaneously. simultaneously.
The "System.IO" library manages multiplexing in its own way. On The "System.IO" module manages multiplexing in its own way. On
Windows systems it uses @safe@ foreign calls to ensure that Windows systems it uses @safe@ foreign calls to ensure that
threads doing I\/O operations don't block the whole runtime, threads doing I\/O operations don't block the whole runtime,
whereas on Unix systems all the currently blocked I\/O requests whereas on Unix systems all the currently blocked I\/O requests
...@@ -401,7 +401,7 @@ foreign import ccall safe "fdReady" ...@@ -401,7 +401,7 @@ foreign import ccall safe "fdReady"
If you don't use the @-threaded@ option, then the runtime does If you don't use the @-threaded@ option, then the runtime does
not make use of multiple OS threads. Foreign calls will block not make use of multiple OS threads. Foreign calls will block
all other running Haskell threads until the call returns. The all other running Haskell threads until the call returns. The
"System.IO" library still does multiplexing, so there can be multiple "System.IO" module still does multiplexing, so there can be multiple
threads doing I\/O, and this is handled internally by the runtime using threads doing I\/O, and this is handled internally by the runtime using
@select@. @select@.
-} -}
......
...@@ -65,7 +65,7 @@ import GHC.Internal.Control.Monad ...@@ -65,7 +65,7 @@ import GHC.Internal.Control.Monad
{- $naming {- $naming
The functions in this library use the following naming conventions: The functions in this module use the following naming conventions:
* A postfix \'@M@\' always stands for a function in the Kleisli category: * A postfix \'@M@\' always stands for a function in the Kleisli category:
The monad type constructor @m@ is added to function results The monad type constructor @m@ is added to function results
......
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : stable -- Stability : stable
-- Portability : non-portable (requires universal quantification for runST) -- Portability : non-portable (requires universal quantification for runST)
-- --
-- This library provides support for /strict/ state threads, as -- This module provides support for /strict/ state threads, as
-- described in the PLDI \'94 paper by John Launchbury and Simon Peyton -- described in the PLDI \'94 paper by John Launchbury and Simon Peyton
-- Jones /Lazy Functional State Threads/. -- Jones /Lazy Functional State Threads/.
-- --
......
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : stable -- Stability : stable
-- Portability : non-portable (requires universal quantification for runST) -- Portability : non-portable (requires universal quantification for runST)
-- --
-- This library provides support for /strict/ state threads, as -- This module provides support for /strict/ state threads, as
-- described in the PLDI \'94 paper by John Launchbury and Simon Peyton -- described in the PLDI \'94 paper by John Launchbury and Simon Peyton
-- Jones /Lazy Functional State Threads/. -- Jones /Lazy Functional State Threads/.
-- --
......
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : stable -- Stability : stable
-- Portability : non-portable (requires universal quantification for runST) -- Portability : non-portable (requires universal quantification for runST)
-- --
-- This library provides support for /strict/ state threads, as -- This module provides support for /strict/ state threads, as
-- described in the PLDI \'94 paper by John Launchbury and Simon Peyton -- described in the PLDI \'94 paper by John Launchbury and Simon Peyton
-- Jones /Lazy Functional State Threads/. -- Jones /Lazy Functional State Threads/.
-- --
......
...@@ -9,7 +9,7 @@ ...@@ -9,7 +9,7 @@
-- Stability : stable -- Stability : stable
-- Portability : non-portable (local universal quantification in ReadP) -- Portability : non-portable (local universal quantification in ReadP)
-- --
-- A general library for representation and manipulation of versions. -- A general API for representation and manipulation of versions.
-- --
-- Versioning schemes are many and varied, so the version -- Versioning schemes are many and varied, so the version
-- representation provided by this library is intended to be a -- representation provided by this library is intended to be a
......
...@@ -32,4 +32,4 @@ module GHC.IO.Encoding.UTF16 ...@@ -32,4 +32,4 @@ module GHC.IO.Encoding.UTF16
utf16le_encode utf16le_encode
) where ) where
import GHC.Internal.IO.Encoding.UTF16 import GHC.Internal.IO.Encoding.UTF16
\ No newline at end of file
...@@ -7,7 +7,7 @@ ...@@ -7,7 +7,7 @@
-- | -- |
-- This module is an internal GHC module. It declares the constants used -- This module is an internal GHC module. It declares the constants used
-- in the implementation of type-level natural numbers. The programmer interface -- in the implementation of type-level natural numbers. The programmer interface
-- for working with type-level naturals should be defined in a separate library. -- for working with type-level naturals should be defined in a separate module.
-- --
-- @since 4.10.0.0 -- @since 4.10.0.0
-- --
......
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : stable -- Stability : stable
-- Portability : portable -- Portability : portable
-- --
-- This library provides facilities for parsing the command-line options -- This module provides facilities for parsing the command-line options
-- in a standalone program. It is essentially a Haskell port of the GNU -- in a standalone program. It is essentially a Haskell port of the GNU
-- @getopt@ library. -- @getopt@ library.
-- --
......
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : stable -- Stability : stable
-- Portability : portable -- Portability : portable
-- --
-- The standard IO library. -- The standard IO API.
-- --
module System.IO module System.IO
......
...@@ -32,7 +32,7 @@ ...@@ -32,7 +32,7 @@
-- alive for ever. One way to solve this is to purge the table -- alive for ever. One way to solve this is to purge the table
-- occasionally, by deleting entries whose keys have died. -- occasionally, by deleting entries whose keys have died.
-- --
-- The weak pointers in this library -- The weak pointers in this module
-- support another approach, called /finalization/. -- support another approach, called /finalization/.
-- When the key referred to by a weak pointer dies, the storage manager -- When the key referred to by a weak pointer dies, the storage manager
-- arranges to run a programmer-specified finalizer. In the case of memo -- arranges to run a programmer-specified finalizer. In the case of memo
...@@ -43,7 +43,7 @@ ...@@ -43,7 +43,7 @@
-- key\/value pair might itself contain a pointer to the key. -- key\/value pair might itself contain a pointer to the key.
-- So the memo table keeps the value alive, which keeps the key alive, -- So the memo table keeps the value alive, which keeps the key alive,
-- even though there may be no other references to the key so both should -- even though there may be no other references to the key so both should
-- die. The weak pointers in this library provide a slight -- die. The weak pointers in this module provide a slight
-- generalisation of the basic weak-pointer idea, in which each -- generalisation of the basic weak-pointer idea, in which each
-- weak pointer actually contains both a key and a value. -- weak pointer actually contains both a key and a value.
-- --
......
...@@ -17,7 +17,7 @@ ...@@ -17,7 +17,7 @@
-- bound, e.g., @base < 4.X@ rather than @base < 5@, because the interface can -- bound, e.g., @base < 4.X@ rather than @base < 5@, because the interface can
-- change rapidly without much warning. -- change rapidly without much warning.
-- --
-- This library is built on *every* platform, including Win32. -- This module is built on *every* platform, including Win32.
-- --
-- Non-POSIX compliant in order to support the following features: -- Non-POSIX compliant in order to support the following features:
-- * S_ISSOCK (no sockets in POSIX) -- * S_ISSOCK (no sockets in POSIX)
......
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : provisional -- Stability : provisional
-- Portability : non-portable (local universal quantification) -- Portability : non-portable (local universal quantification)
-- --
-- This is a library of parser combinators, originally written by Koen Claessen. -- This is a module of parser combinators, originally written by Koen Claessen.
-- It parses all alternatives in parallel, so it never keeps hold of -- 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 -- the beginning of the input string, a common source of space leaks with
-- other parsers. The @('+++')@ choice combinator is genuinely commutative; -- other parsers. The @('+++')@ choice combinator is genuinely commutative;
...@@ -60,4 +60,4 @@ module Text.ParserCombinators.ReadP ...@@ -60,4 +60,4 @@ module Text.ParserCombinators.ReadP
-- $properties -- $properties
) where ) where
import GHC.Internal.Text.ParserCombinators.ReadP import GHC.Internal.Text.ParserCombinators.ReadP
\ No newline at end of file
...@@ -10,7 +10,7 @@ ...@@ -10,7 +10,7 @@
-- Stability : provisional -- Stability : provisional
-- Portability : non-portable (uses Text.ParserCombinators.ReadP) -- Portability : non-portable (uses Text.ParserCombinators.ReadP)
-- --
-- This library defines parser combinators for precedence parsing. -- This module defines parser combinators for precedence parsing.
module Text.ParserCombinators.ReadPrec module Text.ParserCombinators.ReadPrec
(ReadPrec, (ReadPrec,
...@@ -37,4 +37,4 @@ module Text.ParserCombinators.ReadPrec ...@@ -37,4 +37,4 @@ module Text.ParserCombinators.ReadPrec
readS_to_Prec readS_to_Prec
) where ) where
import GHC.Internal.Text.ParserCombinators.ReadPrec import GHC.Internal.Text.ParserCombinators.ReadPrec
\ No newline at end of file
...@@ -12,7 +12,7 @@ ...@@ -12,7 +12,7 @@
-- --
-- Converting strings to values. -- Converting strings to values.
-- --
-- The "Text.Read" library is the canonical library to import for -- The "Text.Read" module is the canonical place to import for
-- 'Read'-class facilities. For GHC only, it offers an extended and much -- 'Read'-class facilities. For GHC only, it offers an extended and much
-- improved 'Read' class, which constitutes a proposed alternative to the -- improved 'Read' class, which constitutes a proposed alternative to the
-- Haskell 2010 'Read'. In particular, writing parsers is easier, and -- Haskell 2010 'Read'. In particular, writing parsers is easier, and
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment