Skip to content

Commit

Permalink
🧩 [move]: Consistent folder structure.
Browse files Browse the repository at this point in the history
  • Loading branch information
rolyp committed Oct 25, 2023
1 parent be42797 commit 903179e
Show file tree
Hide file tree
Showing 6 changed files with 6 additions and 6 deletions.
2 changes: 1 addition & 1 deletion test/Benchmark.purs
Original file line number Diff line number Diff line change
@@ -1,13 +1,13 @@
module Test.Benchmark where

import Prelude
import Benchmark.Util (BenchAcc(..), BenchRow)
import Data.Array (concat)
import Data.Array.NonEmpty (fromArray)
import Data.Traversable (sequence)
import Effect (Effect)
import Effect.Aff (Aff, launchAff_)
import Effect.Class.Console (logShow)
import Test.Benchmark.Util (BenchAcc(..), BenchRow)
import Test.Many (many, bwdMany, withDatasetMany)
import Test.Spec.Specs (misc_cases, bwd_cases, desugar_cases, graphics_cases)
import Util (type (×), definitely, (×))
Expand Down
4 changes: 2 additions & 2 deletions test/Benchmark/Util.purs
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
module Benchmark.Util where
module Test.Benchmark.Util where

import Prelude

Expand All @@ -13,7 +13,7 @@ import Data.Newtype (class Newtype, over2)
import Data.Tuple (snd)
import Effect.Class (class MonadEffect, liftEffect)
import Graph (class Graph, size)
import Test.Spec.Microtime (microtime)
import Test.Util.Microtime (microtime)
import Util (type (×), (×))

newtype BenchAcc = BenchAcc (NonEmptyArray (String × BenchRow))
Expand Down
2 changes: 1 addition & 1 deletion test/Many.purs
Original file line number Diff line number Diff line change
Expand Up @@ -3,10 +3,10 @@ module Test.Many where
import Prelude

import App.Fig (linkResult, loadLinkFig)
import Benchmark.Util (BenchRow)
import Data.Array (zip)
import Effect.Aff (Aff)
import Module (File(..), Folder(..), datasetAs, defaultImports, loadFile)
import Test.Benchmark.Util (BenchRow)
import Test.Util (TestBwdSpec, TestLinkSpec, TestSpec, TestWithDatasetSpec, checkPretty, test)
import Util (type (×), (×))

Expand Down
2 changes: 1 addition & 1 deletion test/Util.purs
Original file line number Diff line number Diff line change
Expand Up @@ -4,7 +4,6 @@ import Prelude hiding (absurd)

import App.Fig (LinkFigSpec)
import App.Util (Selector)
import Benchmark.Util (BenchRow, bench, divRow, graphSizeB)
import Control.Monad.Error.Class (class MonadError, class MonadThrow)
import Control.Monad.Writer.Class (class MonadWriter)
import Control.Monad.Writer.Trans (runWriterT)
Expand All @@ -29,6 +28,7 @@ import Module (File, initialConfig, open, parse)
import Parse (program)
import Pretty (class Pretty, prettyP)
import SExpr (Expr) as SE
import Test.Benchmark.Util (BenchRow, bench, divRow, graphSizeB)
import Test.Spec.Assertions (fail)
import Util (type (×), successful, (×))
import Val (class Ann, Env, Val(..))
Expand Down
File renamed without changes.
2 changes: 1 addition & 1 deletion test/Spec/Microtime.purs → test/Util/Microtime.purs
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
module Test.Spec.Microtime
module Test.Util.Microtime
( microtime
) where

Expand Down

0 comments on commit 903179e

Please sign in to comment.