Skip to content
This repository has been archived by the owner on Nov 24, 2022. It is now read-only.

Commit

Permalink
wip-nofib pedantry: remove some warnings
Browse files Browse the repository at this point in the history
  • Loading branch information
gkaracha committed May 19, 2020
1 parent 621dd09 commit ad12f14
Show file tree
Hide file tree
Showing 21 changed files with 27 additions and 6 deletions.
1 change: 1 addition & 0 deletions asterius/nofib/imaginary/exp3_8/Main.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
{-# OPTIONS_GHC -Wno-tabs #-}
{-# OPTIONS_GHC -Wno-missing-methods #-}
{-
From [email protected] Sat Jan 11 11:56:04 1992
From: [email protected] (Lennart Augustsson)
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/anna/BaseDefs.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
{-# OPTIONS_GHC -Wno-tabs #-}
{-# OPTIONS_GHC -Wno-missing-methods #-}

-- ==========================================================--
-- === Base declarations BaseDefs.hs ===--
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/bspt/Input.lhs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Input where
import Interpret
import Euclid
Expand Down
3 changes: 2 additions & 1 deletion asterius/nofib/real/bspt/Rationals.lhs
Original file line number Diff line number Diff line change
@@ -1,3 +1,4 @@
> {-# OPTIONS_GHC -Wno-missing-methods #-}
> module Rationals

> (Rationals(..),rndNR)
Expand All @@ -21,7 +22,7 @@
> (p :%% q) <= (r :%% s) = p*s <= q*r

> instance Num Rationals where

(+): rational addition is performed by converting
the arguments to a form where they share a common
denominator.
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/hidden/Geometric.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
{-# OPTIONS_GHC -Wno-tabs #-}
{-# OPTIONS_GHC -Wno-missing-methods #-}
module Geometric (Geom(..)) where
import Numbers
import Vectors
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/hidden/Numbers.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
{-# OPTIONS_GHC -Wno-tabs #-}
{-# OPTIONS_GHC -Wno-missing-methods #-}
module Numbers(Number) where
data Number = Tolerant Float
-- if you are not using the Chalmers Haskell B compiler then remove the @
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/linear/Cg.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -16,6 +16,7 @@


\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Cg(cgiters,Cg_state (..),showcg_state)
where
Expand Down
2 changes: 1 addition & 1 deletion asterius/nofib/real/linear/Densematrix.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -32,7 +32,7 @@
assumes the arg is column major.

\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Densematrix(Matrix,Vector,
mmult, madd, msub, vouter, vdot, norm ,mneg ,mxpose,mident, msize,
mkmat, mkrmat, mkcmat, mkvec, mkrvec, mkcvec,
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/linear/Input.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -29,6 +29,7 @@ Notes:
(r,c,b) = (r-1,c-1,..) to make indices zero origin.

\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Input
(gmat,rhside,soln_vect,wells,split,blm',mkbigvec,
mksparse,a_easy,a_hard,x1) where
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/linear/Matlib.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -22,6 +22,7 @@ Notes:
The import of AbsDensematrix is to keep hbc happy.

\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Matlib (scale, precond, uncondition) where
import Data.List (genericLength)
Expand Down
3 changes: 2 additions & 1 deletion asterius/nofib/real/linear/Matrix.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -8,6 +8,7 @@
=======================================================================

\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Matrix
(Matrix, Vector, Block , Vec ,
Expand Down Expand Up @@ -145,7 +146,7 @@ mupdate m (i,j) val
where
f xs = (take j xs) ++ [(i, (j+1), val)] ++ (drop (j+1) xs)
vupdate v i vc = (take i v) ++ [vc] ++ (drop (i+1) v)
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/real/symalg/BasicNumber.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
{-# OPTIONS_GHC -Wno-tabs #-}
{-# OPTIONS_GHC -Wno-missing-methods #-}
module BasicNumber (BasicNumber (..), makeReal, makeRational, RealT{-partain-}) where

import RealM
Expand Down
2 changes: 2 additions & 0 deletions asterius/nofib/real/veritas/Type_defs.lhs
Original file line number Diff line number Diff line change
@@ -1,3 +1,5 @@
> {-# OPTIONS_GHC -Wno-missing-methods #-}

> module Type_defs where

> import Core_datatype
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/spectral/atom/Main.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,5 @@
{-# OPTIONS_GHC -Wno-tabs #-}
{-# OPTIONS_GHC -Wno-missing-methods #-}
{- A kernel fragment from a program written by
Ron Legere -- http://www.its.caltech.edu/~legere
Caltech Quantum Optics
Expand Down
3 changes: 2 additions & 1 deletion asterius/nofib/spectral/knights/ChessSetList.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -9,6 +9,7 @@ data parallel search (for instance wedge first??). This module
abstracts data type specific operations used in the Heuristic part of the tour.

\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module ChessSetList(Tile,
ChessSet,
createBoard,
Expand Down Expand Up @@ -61,7 +62,7 @@ instance Eq ChessSet where
_ == _ = True
instance Ord ChessSet where
_ <= _ = True
_ <= _ = True
instance Show ChessSet where
showsPrec p board@(Board sze n f ts)
Expand Down
3 changes: 2 additions & 1 deletion asterius/nofib/spectral/knights/KnightHeuristic.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
\section{Knights Tour Heuristic.}
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%M O D U L E%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module KnightHeuristic(
ChessSet,
startTour,
Expand Down Expand Up @@ -127,7 +128,7 @@ descendents board
where
singles = singleDescend board
singleDescend::ChessSet -> [ChessSet]
singleDescend::ChessSet -> [ChessSet]
singleDescend board =[x | (y,x) <- descAndNo board, y==1]
descAndNo::ChessSet -> [(Int,ChessSet)]
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/spectral/knights/Main.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,7 @@
\section{The Main Program.}
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%M O D U L E%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Main(main) where
\end{code}
%%%%%%%%%%%%%%%%%% I M P O R T S / T Y P E D E F S %%%%%%%%%%%%%%
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/spectral/knights/Queue.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -5,6 +5,7 @@
\section{A Queue Abstract data type}
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Queue(
Queue, createQueue, addFront, addBack,
addAllFront, addAllBack, inquireFront,
Expand Down
3 changes: 2 additions & 1 deletion asterius/nofib/spectral/knights/Sort.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -10,6 +10,7 @@ i.e ``{\tt import Sort(lazySort) renaming sort}'' imports {\tt lazySort},
which can be referenced in the current scope as {\tt sort}.

\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Sort(insertSort,mergeSort,quickSort,lazySort) where
\end{code}
Expand Down Expand Up @@ -144,7 +145,7 @@ rands s1 s2
= if z < 1 then z + 2147483562 : rands s1'' s2''
else
z : rands s1'' s2''
where
where
k = s1 `div` 53668
s1' = 40014 * (s1 - k * 53668) - k * 12211
s1'' = if s1' < 0 then s1' + 2147483563 else s1'
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/spectral/mandel/Mandel.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -7,6 +7,7 @@
%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%%
\begin{onlystandalone}
\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module Mandel where
import Data.Complex -- 1.3
import PortablePixmap
Expand Down
1 change: 1 addition & 0 deletions asterius/nofib/spectral/mandel/PortablePixmap.lhs
Original file line number Diff line number Diff line change
Expand Up @@ -95,6 +95,7 @@ AUTHOR
Sun Release 4.1 Last change: 15 September 1990 2
\end{verbatim}
\begin{code}
{-# OPTIONS_GHC -Wno-tabs #-}
module PortablePixmap where
data PixMap = Pixmap Integer Integer Int [(Int,Int,Int)]
Expand Down

0 comments on commit ad12f14

Please sign in to comment.