Thread Rating:
  • 0 Vote(s) - 0 Average
  • 1
  • 2
  • 3
  • 4
  • 5
Sorting Arrays
#11
DirectQB came with a built in sorting routine... Maybe Lilo could offer some advice on porting it to 32-bit asm. Wink
Reply
#12
What's DirectQB? Is it open source?
Reply
#13
It was one of the most popular QB libraries. The asm files were included in the package... Pretty much anything that was for QB was open source. Wink
Reply
#14
Naah, IIRC the DQB array sorting routine used bubble sort, which is much slower than quick sort.
Better to recode a quick sort routine from scratch using the inline asm FB provides, if the array sorting is the real bottleneck of your app.
A hint to speed things up: don't sort the strings. Sort pointers to the string. I mean, have a complementary array of pointers to each string of your original array, then do the sort on this. This way when two elements are to be swapped, you just swap 4 bytes with a single MOV, instead of copying the whole string.
ngelo Mottola - EC++
Reply
#15
Using a pointers table as Angelo suggested and zstrings the result was 8.2 secs on my 1.8 athlon, now using the GDSL library + strcmp(), i got 5.2 secs (GDSL is a static lib, so the exe was 17kb, no DLL's are needed), here's the test:

Code:
#include once "gdsl/gdsl.bi"
#include once "crt.bi"

declare sub quicksort(byval min,byval max)
declare sub fillarray(byval min,byval max)

const elements = 3000000

    dim shared myarray(0 to elements-1) as zstring * 8
    dim shared ptrarray(0 to elements-1) as zstring ptr

    '' using quicksort in FB
    fillarray(0, elements-1)
    t# = timer
    quicksort(0, elements-1)
    print timer - t#
    
    '' using gdsl + strcmp
    fillarray(0, elements-1)
    t# = timer
    gdsl_sort( @ptrarray(0), elements, @strcmp )
    print timer - t#

'':::::
sub fillarray(byval min,byval max)
    dim i as integer
    dim s as string
    
    for i = max to min step -1
        s = str$(i)
        if len(s) < 7 then
            s += string$(7 - len(s), " ")
        end if
        myarray(max-i) = s
        ptrarray(i) = @myarray(i)
    next z
end sub

'':::::
sub quicksort(byval min,byval max)
    dim p1,p2,midd as zstring*8

    if min < max then
        p1 = min
        p2 = max
        midd = *ptrarray((min + max) \ 2)
        do until p1 > p2
            do while *ptrarray(p1) < midd
                p1 += 1
            loop
            do while midd < *ptrarray(p2)
                p2 -= 1
            loop
            if p1 <= p2 then
                swap ptrarray(p1), ptrarray(p2)
                p1 += 1
                p2 -= 1
            end if
        loop
        if min < p2 then quicksort min, p2
        if p1 < max then quicksort p1, max
    end if
    
end sub
Reply
#16
Quote:......I have somewhere a nonrecursive quicksort that should be faster.....
Here's a non-recursive quicksort by Ethan Winer, right out of his book.
Code:
'********* QSORT.BAS - Quick Sort algorithm demonstration
'Copyright (c) 1992 Ethan Winer

SUB QSort (StartEl, NumEls) STATIC

DIM Temp AS SortType
REDIM QStack(NumEls \ 5 + 10) 'create a stack

First = StartEl               'initialize work variables
Last = StartEl + NumEls - 1
StackPtr=0                    '(This was missing in Winer's code)

DO
  DO
    Temp = Sortarray((Last + First) \ 2)  'seek midpoint
    I = First
    J = Last

    DO     'reverse both < and > below to sort descending
      WHILE Sortarray(I).Length < Temp.Length
        I = I + 1
      WEND
      WHILE Sortarray(J).Length > Temp.Length
        J = J - 1
      WEND
      IF I > J THEN EXIT DO
      IF I < J THEN SWAP Sortarray(I), Sortarray(J) : SwapBars I, J
      I = I + 1
      J = J - 1
    LOOP WHILE I <= J

    IF I < Last THEN                    'Done
      QStack(StackPtr) = I              'Push I
      QStack(StackPtr + 1) = Last       'Push Last
      StackPtr = StackPtr + 2
    END IF

    Last = J
  LOOP WHILE First < Last

  IF StackPtr = 0 THEN EXIT DO
  StackPtr = StackPtr - 2
  First = QStack(StackPtr)              'Pop First
  Last = QStack(StackPtr + 1)           'Pop Last
LOOP

ERASE QStack               'delete the stack array

END SUB
Reply
#17
There is a modified bubble-sort algorithm on BYTE-the small systems journal 1991.april.pp315. Here is the code, where I added this combsort into qb45's sortdemo.bas
Sorry, I can not find the paper now, and sorry for the Chinese comments.
Quote:' ============================================================================
' SORTDEMO
' This program graphically demonstrates six common sorting algorithms. It
' prints 25 or 43 horizontal bars, all of different lengths and all in random
' order, then sorts the bars from smallest to longest.
'
' The program also uses SOUND statements to generate different pitches,
' depending on the location of the bar being printed. Note that the SOUND
' statements delay the speed of each sorting algorithm so you can follow
' the progress of the sort. Therefore, the times shown are for comparison
' only. They are not an accurate measure of sort speed.
'
' If you use these sorting routines in your own programs, you may notice
' a difference in their relative speeds (for example, the exchange
' sort may be faster than the shell sort) depending on the number of
' elements to be sorted and how "scrambled" they are to begin with.
' ============================================================================

DEFINT A-Z ' Default type integer.

' Declare FUNCTION and SUB procedures, and the number and type of arguments:
DECLARE FUNCTION RandInt% (lower, Upper)

DECLARE SUB BoxInit ()
DECLARE SUB BubbleSort ()
DECLARE SUB CheckScreen ()
DECLARE SUB CombSort ()
DECLARE SUB DrawFrame (TopSide, BottomSide, LeftSide, RightSide)
DECLARE SUB ElapsedTime (CurrentRow)
DECLARE SUB ExchangeSort ()
DECLARE SUB HeapSort ()
DECLARE SUB Initialize ()
DECLARE SUB InsertionSort ()
DECLARE SUB PercolateDown (MaxLevel)
DECLARE SUB PercolateUp (MaxLevel)
DECLARE SUB PrintOneBar (Row)
DECLARE SUB QuickSort (Low, High)
DECLARE SUB Reinitialize ()
DECLARE SUB ShellSort ()
DECLARE SUB SortMenu ()
DECLARE SUB SwapBars (Row1, Row2)
DECLARE SUB ToggleSound (Row, Column)

' Define the data type used to hold the information for each colored bar:
TYPE SortType
Length AS INTEGER ' Bar length (the element compared
' in the different sorts)
ColorVal AS INTEGER ' Bar color
BarString AS STRING * 43 ' The bar (a string of 43 characters)
END TYPE

' Declare global constants:
CONST FALSE = 0, TRUE = NOT FALSE, LEFTCOLUMN = 49
CONST NUMOPTIONS = 11, NUMSORTS = 7 '添加方法数目,就要增加NUMSORTS

' Declare global variables, and allocate storage space for them. SortArray
' and SortBackup are both arrays of the data type SortType defined above:
DIM SHARED SortArray(1 TO 43) AS SortType, SortBackup(1 TO 43) AS SortType
DIM SHARED OptionTitle(1 TO NUMOPTIONS) AS STRING * 12
DIM SHARED StartTime AS SINGLE
DIM SHARED Foreground, Background, NoSound, Pause
DIM SHARED Selection, MaxRow, InitRow, MaxColors

' Data statements for the different options printed in the sort menu:
DATA Insertion, Bubble, Heap, Exchange, Shell, Quick, Comb
DATA Toggle Sound, , < (Slower), > (Faster)

' Begin logic of module-level code:

Initialize ' Initialize data values.
SortMenu ' Print sort menu.
WIDTH 80, InitRow ' Restore original number of rows.
COLOR 7, 0 ' Restore default color
CLS
END

' GetRow, MonoTrap, and RowTrap are error-handling routines invoked by
' the CheckScreen SUB procedure. GetRow determines whether the program
' started with 25, 43, or 50 lines. MonoTrap determines the current
' video adapter is monochrome. RowTrap sets the maximum possible
' number of rows (43 or 25).

GetRow:
IF InitRow = 50 THEN
InitRow = 43
RESUME
ELSE
InitRow = 25
RESUME NEXT
END IF


MonoTrap:
MaxColors = 2
RESUME NEXT

RowTrap:
MaxRow = 25
RESUME

' =============================== BoxInit ====================================
' Calls the DrawFrame procedure to draw the frame around the sort menu,
' then prints the different options stored in the OptionTitle array.
' ============================================================================
'
SUB BoxInit STATIC
DrawFrame 1, 22, LEFTCOLUMN - 3, 78

LOCATE 3, LEFTCOLUMN + 2: PRINT "QUICKBASIC SORTING DEMO";
LOCATE 5
FOR I = 1 TO NUMOPTIONS - 1
LOCATE , LEFTCOLUMN: PRINT OptionTitle(I)
NEXT I

' Don't print the last option (> Faster) if the length of the Pause
' is down to 1 clock tick:
IF Pause > 1 THEN LOCATE , LEFTCOLUMN: PRINT OptionTitle(NUMOPTIONS);

' Toggle sound on or off, then print the current value for NoSound:
NoSound = NOT NoSound
ToggleSound 12, LEFTCOLUMN + 12

LOCATE NUMOPTIONS + 6, LEFTCOLUMN
PRINT "Type first character of"
LOCATE , LEFTCOLUMN
PRINT "choice( I B H E S Q C T < > )"
LOCATE , LEFTCOLUMN
PRINT "or ESC key to end program: ";
END SUB

' ============================== BubbleSort ==================================
' The BubbleSort algorithm cycles through SortArray, comparing adjacent
' elements and swapping pairs that are out of order. It continues to
' do this until no pairs are swapped.
' ============================================================================
'
SUB BubbleSort STATIC
Limit = MaxRow
DO
Switch = FALSE
FOR Row = 1 TO (Limit - 1)

' Two adjacent elements are out of order, so swap their values
' and redraw those two bars:
IF SortArray(Row).Length > SortArray(Row + 1).Length THEN
SWAP SortArray(Row), SortArray(Row + 1)
SwapBars Row, Row + 1
Switch = Row
END IF
NEXT Row

' Sort on next pass only to where the last switch was made:
Limit = Switch
LOOP WHILE Switch

END SUB

' ============================== CheckScreen =================================
' Checks for type of monitor (VGA, EGA, CGA, or monochrome) and
' starting number of screen lines (50, 43, or 25).
' ============================================================================
'
SUB CheckScreen STATIC

' Try locating to the 50th row; if that fails, try the 43rd. Finally,
' if that fails, the user was using 25-line mode:
InitRow = 50
ON ERROR GOTO GetRow
LOCATE InitRow, 1

' Try a SCREEN 1 statement to see if the current adapter has color
' graphics; if that causes an error, reset MaxColors to 2:
MaxColors = 15
ON ERROR GOTO MonoTrap
SCREEN 1
SCREEN 0

' See if 43-line mode is accepted; if not, run this program in 25-line
' mode:
MaxRow = 43
ON ERROR GOTO RowTrap
WIDTH 80, MaxRow
ON ERROR GOTO 0 ' Turn off error trapping.
END SUB

SUB CombSort STATIC
'摘自BYTE-the small systems journal 1991.april.pp315
' 1.3是经过大量试验得到的一个经验常数。gap是shrinkfactor,当取为1的时候就是冒泡法。
' list can conclude its journey toward 1 in only 3 ways
' 9 6 4 3 2 1
' 10 7 5 3 2 1
' 11 8 6 4 3 2 1
'该方法也不同于SHELL。SHELL也用一个系数,接近1.7,但是SHELL总是比较所有的数

Gap = MaxRow
DO
IF INT(Gap / 1.3) > 1 THEN
Gap = INT(Gap / 1.3)
ELSE
Gap = 1
END IF
Switch = FALSE
FOR Row = 1 TO MaxRow - Gap

' Two adjacent elements are out of order, so swap their values
' and redraw those two bars:
IF SortArray(Row).Length > SortArray(Row + Gap).Length THEN
SWAP SortArray(Row), SortArray(Row + Gap)
SwapBars Row, Row + Gap
Switch = Switch + 1
END IF
NEXT Row

LOOP UNTIL Switch = 0 AND Gap = 1

END SUB

' ============================== DrawFrame ===================================
' Draws a rectangular frame using the high-order ASCII characters ?(201) ,
' ?(187) , ?(200) , ?(188) , ?(186) , and ?(205). The parameters
' TopSide, BottomSide, LeftSide, and RightSide are the row and column
' arguments for the upper-left and lower-right corners of the frame.
' ============================================================================
'
SUB DrawFrame (TopSide, BottomSide, LeftSide, RightSide) STATIC
CONST ULEFT = 201, URIGHT = 187, LLEFT = 200, LRIGHT = 188
CONST VERTICAL = 186, HORIZONTAL = 205

FrameWidth = RightSide - LeftSide - 1
LOCATE TopSide, LeftSide
PRINT CHR$(ULEFT); STRING$(FrameWidth, HORIZONTAL); CHR$(URIGHT);
FOR Row = TopSide + 1 TO BottomSide - 1
LOCATE Row, LeftSide
PRINT CHR$(VERTICAL); SPC(FrameWidth); CHR$(VERTICAL);
NEXT Row
LOCATE BottomSide, LeftSide
PRINT CHR$(LLEFT); STRING$(FrameWidth, HORIZONTAL); CHR$(LRIGHT);
END SUB

' ============================= ElapsedTime ==================================
' Prints seconds elapsed since the given sorting routine started.
' Note that this time includes both the time it takes to redraw the
' bars plus the pause while the SOUND statement plays a note, and
' thus is not an accurate indication of sorting speed.
' ============================================================================
'
SUB ElapsedTime (CurrentRow) STATIC
CONST FORMAT = " &###.### seconds "

' Print current selection and number of seconds elapsed in
' reverse video:
COLOR Foreground, Background
LOCATE Selection + 4, LEFTCOLUMN - 2
PRINT USING FORMAT; OptionTitle(Selection); TIMER - StartTime;

IF NoSound THEN
SOUND 30000, Pause ' Sound off, so just pause.
ELSE
SOUND 60 * CurrentRow, Pause ' Sound on, so play a note while
END IF ' pausing.

COLOR MaxColors, 0 ' Restore regular foreground and
' background colors.
END SUB

' ============================= ExchangeSort =================================
' The ExchangeSort compares each element in SortArray - starting with
' the first element - with every following element. If any of the
' following elements is smaller than the current element, it is exchanged
' with the current element and the process is repeated for the next
' element in SortArray.
' ============================================================================
'
SUB ExchangeSort STATIC
FOR Row = 1 TO MaxRow
SmallestRow = Row
FOR J = Row + 1 TO MaxRow
IF SortArray(J).Length < SortArray(SmallestRow).Length THEN
SmallestRow = J
ElapsedTime J
END IF
NEXT J

' Found a row shorter than the current row, so swap those
' two array elements:
IF SmallestRow > Row THEN
SWAP SortArray(Row), SortArray(SmallestRow)
SwapBars Row, SmallestRow
END IF
NEXT Row
END SUB

' =============================== HeapSort ===================================
' The HeapSort procedure works by calling two other procedures - PercolateUp
' and PercolateDown. PercolateUp turns SortArray into a "heap," which has
' the properties outlined in the diagram below:
'
' SortArray(1)
' / \
' SortArray(2) SortArray(3)
' / \ / \
' SortArray(4) SortArray(5) SortArray(6) SortArray(7)
' / \ / \ / \ / \
' ... ... ... ... ... ... ... ...
'
'
' where each "parent node" is greater than each of its "child nodes"; for
' example, SortArray(1) is greater than SortArray(2) or SortArray(3),
' SortArray(3) is greater than SortArray(6) or SortArray(7), and so forth.
'
' Therefore, once the first FOR...NEXT loop in HeapSort is finished, the
' largest element is in SortArray(1).
'
' The second FOR...NEXT loop in HeapSort swaps the element in SortArray(1)
' with the element in MaxRow, rebuilds the heap (with PercolateDown) for
' MaxRow - 1, then swaps the element in SortArray(1) with the element in
' MaxRow - 1, rebuilds the heap for MaxRow - 2, and continues in this way
' until the array is sorted.
' ============================================================================
'
SUB HeapSort STATIC
FOR I = 2 TO MaxRow
PercolateUp I
NEXT I

FOR I = MaxRow TO 2 STEP -1
SWAP SortArray(1), SortArray(I)
SwapBars 1, I
PercolateDown I - 1
NEXT I
END SUB

' ============================== Initialize ==================================
' Initializes the SortBackup and OptionTitle arrays. It also calls the
' CheckScreen, BoxInit, and RandInt% procedures.
' ============================================================================
'
SUB Initialize STATIC
DIM TempArray(1 TO 43)

CheckScreen ' Check for monochrome or EGA and set
' maximum number of text lines.
FOR I = 1 TO MaxRow
TempArray(I) = I
NEXT I

MaxIndex = MaxRow

RANDOMIZE TIMER ' Seed the random-number generator.
FOR I = 1 TO MaxRow

' Call RandInt% to find a random element in TempArray between 1
' and MaxIndex, then assign the value in that element to BarLength:
Index = RandInt%(1, MaxIndex)
BarLength = TempArray(Index)

' Overwrite the value in TempArray(Index) with the value in
' TempArray(MaxIndex) so the value in TempArray(Index) is
' chosen only once:
TempArray(Index) = TempArray(MaxIndex)

' Decrease the value of MaxIndex so that TempArray(MaxIndex) can't
' be chosen on the next pass through the loop:
MaxIndex = MaxIndex - 1

' Assign the BarLength value to the .Length element, then store
' a string of BarLength block characters (ASCII 223: ? in the
' .BarString element:
SortBackup(I).Length = BarLength
SortBackup(I).BarString = STRING$(BarLength, 223)

' Store the appropriate color value in the .ColorVal element:
IF MaxColors > 2 THEN
SortBackup(I).ColorVal = (BarLength MOD MaxColors) + 1
ELSE
SortBackup(I).ColorVal = MaxColors
END IF
NEXT I

FOR I = 1 TO NUMOPTIONS ' Read SORT DEMO menu options and store
READ OptionTitle(I) ' them in the OptionTitle array.
NEXT I

CLS
Reinitialize ' Assign values in SortBackup to SortArray and draw
' unsorted bars on the screen.
NoSound = FALSE
Pause = 2 ' Initialize Pause to 2 clock ticks (@ 1/9 second).
BoxInit ' Draw frame for the sort menu and print options.

END SUB

' ============================= InsertionSort ================================
' The InsertionSort procedure compares the length of each successive
' element in SortArray with the lengths of all the preceding elements.
' When the procedure finds the appropriate place for the new element, it
' inserts the element in its new place, and moves all the other elements
' down one place.
' ============================================================================
'
SUB InsertionSort STATIC
DIM TempVal AS SortType
FOR Row = 2 TO MaxRow
TempVal = SortArray(Row)
TempLength = TempVal.Length
FOR J = Row TO 2 STEP -1

' As long as the length of the J-1st element is greater than the
' length of the original element in SortArray(Row), keep shifting
' the array elements down:
IF SortArray(J - 1).Length > TempLength THEN
SortArray(J) = SortArray(J - 1)
PrintOneBar J ' Print the new bar.
ElapsedTime J ' Print the elapsed time.

' Otherwise, exit the FOR...NEXT loop:
ELSE
EXIT FOR
END IF
NEXT J

' Insert the original value of SortArray(Row) in SortArray(J):
SortArray(J) = TempVal
PrintOneBar J
ElapsedTime J
NEXT Row
END SUB

' ============================ PercolateDown =================================
' The PercolateDown procedure restores the elements of SortArray from 1 to
' MaxLevel to a "heap" (see the diagram with the HeapSort procedure).
' ============================================================================
'
SUB PercolateDown (MaxLevel) STATIC
I = 1

' Move the value in SortArray(1) down the heap until it has
' reached its proper node (that is, until it is less than its parent
' node or until it has reached MaxLevel, the bottom of the current heap):
DO
Child = 2 * I ' Get the subscript for the child node.

' Reached the bottom of the heap, so exit this procedure:
IF Child > MaxLevel THEN EXIT DO

' If there are two child nodes, find out which one is bigger:
IF Child + 1 <= MaxLevel THEN
IF SortArray(Child + 1).Length > SortArray(Child).Length THEN
Child = Child + 1
END IF
END IF

' Move the value down if it is still not bigger than either one of
' its children:
IF SortArray(I).Length < SortArray(Child).Length THEN
SWAP SortArray(I), SortArray(Child)
SwapBars I, Child
I = Child

' Otherwise, SortArray has been restored to a heap from 1 to MaxLevel,
' so exit:
ELSE
EXIT DO
END IF
LOOP
END SUB

' ============================== PercolateUp =================================
' The PercolateUp procedure converts the elements from 1 to MaxLevel in
' SortArray into a "heap" (see the diagram with the HeapSort procedure).
' ============================================================================
'
SUB PercolateUp (MaxLevel) STATIC
I = MaxLevel

' Move the value in SortArray(MaxLevel) up the heap until it has
' reached its proper node (that is, until it is greater than either
' of its child nodes, or until it has reached 1, the top of the heap):
DO UNTIL I = 1
Parent = I \ 2 ' Get the subscript for the parent node.

' The value at the current node is still bigger than the value at
' its parent node, so swap these two array elements:
IF SortArray(I).Length > SortArray(Parent).Length THEN
SWAP SortArray(Parent), SortArray(I)
SwapBars Parent, I
I = Parent

' Otherwise, the element has reached its proper place in the heap,
' so exit this procedure:
ELSE
EXIT DO
END IF
LOOP
END SUB

' ============================== PrintOneBar =================================
' Prints SortArray(Row).BarString at the row indicated by the Row
' parameter, using the color in SortArray(Row).ColorVal.
' ============================================================================
'
SUB PrintOneBar (Row) STATIC
LOCATE Row, 1
COLOR SortArray(Row).ColorVal
PRINT SortArray(Row).BarString;
END SUB

' ============================== QuickSort ===================================
' QuickSort works by picking a random "pivot" element in SortArray, then
' moving every element that is bigger to one side of the pivot, and every
' element that is smaller to the other side. QuickSort is then called
' recursively with the two subdivisions created by the pivot. Once the
' number of elements in a subdivision reaches two, the recursive calls end
' and the array is sorted.
' ============================================================================
'
SUB QuickSort (Low, High)
IF Low < High THEN

' Only two elements in this subdivision; swap them if they are out of
' order, then end recursive calls:
IF High - Low = 1 THEN
IF SortArray(Low).Length > SortArray(High).Length THEN
SWAP SortArray(Low), SortArray(High)
SwapBars Low, High
END IF
ELSE

' Pick a pivot element at random, then move it to the end:
RandIndex = RandInt%(Low, High)
SWAP SortArray(High), SortArray(RandIndex)
SwapBars High, RandIndex
Partition = SortArray(High).Length
DO

' Move in from both sides towards the pivot element:
I = Low: J = High
DO WHILE (I < J) AND (SortArray(I).Length <= Partition)
I = I + 1
LOOP
DO WHILE (J > I) AND (SortArray(J).Length >= Partition)
J = J - 1
LOOP

' If we haven't reached the pivot element, it means that two
' elements on either side are out of order, so swap them:
IF I < J THEN
SWAP SortArray(I), SortArray(J)
SwapBars I, J
END IF
LOOP WHILE I < J

' Move the pivot element back to its proper place in the array:
SWAP SortArray(I), SortArray(High)
SwapBars I, High

' Recursively call the QuickSort procedure (pass the smaller
' subdivision first to use less stack space):
IF (I - Low) < (High - I) THEN
QuickSort Low, I - 1
QuickSort I + 1, High
ELSE
QuickSort I + 1, High
QuickSort Low, I - 1
END IF
END IF
END IF
END SUB

' =============================== RandInt% ===================================
' Returns a random integer greater than or equal to the Lower parameter
' and less than or equal to the Upper parameter.
' ============================================================================
'
FUNCTION RandInt% (lower, Upper) STATIC
RandInt% = INT(RND * (Upper - lower + 1)) + lower
END FUNCTION

' ============================== Reinitialize ================================
' Restores the array SortArray to its original unsorted state, then
' prints the unsorted color bars.
' ============================================================================
'
SUB Reinitialize STATIC
FOR I = 1 TO MaxRow
SortArray(I) = SortBackup(I)
NEXT I

FOR I = 1 TO MaxRow
LOCATE I, 1
COLOR SortArray(I).ColorVal
PRINT SortArray(I).BarString;
NEXT I

COLOR MaxColors, 0
END SUB

' =============================== ShellSort ==================================
' The ShellSort procedure is similar to the BubbleSort procedure. However,
' ShellSort begins by comparing elements that are far apart (separated by
' the value of the Offset variable, which is initially half the distance
' between the first and last element), then comparing elements that are
' closer together (when Offset is one, the last iteration of this procedure
' is merely a bubble sort).
' ============================================================================
'
SUB ShellSort STATIC

' Set comparison offset to half the number of records in SortArray:
Offset = MaxRow \ 2

DO WHILE Offset > 0 ' Loop until offset gets to zero.
Limit = MaxRow - Offset
DO
Switch = FALSE ' Assume no switches at this offset.

' Compare elements and switch ones out of order:
FOR Row = 1 TO Limit
IF SortArray(Row).Length > SortArray(Row + Offset).Length THEN
SWAP SortArray(Row), SortArray(Row + Offset)
SwapBars Row, Row + Offset
Switch = Row
END IF
NEXT Row

' Sort on next pass only to where last switch was made:
Limit = Switch - Offset
LOOP WHILE Switch

' No switches at last offset, try one half as big:
Offset = Offset \ 2
LOOP
END SUB

' =============================== SortMenu ===================================
' The SortMenu procedure first calls the Reinitialize procedure to make
' sure the SortArray is in its unsorted form, then prompts the user to
' make one of the following choices:
'
' * One of the sorting algorithms
' * Toggle sound on or off
' * Increase or decrease speed
' * End the program
' ============================================================================
'
SUB SortMenu STATIC
Escape$ = CHR$(27)

' Create a string consisting of all legal choices:
Option$ = "IBHESQC><T" + Escape$

DO

' Make the cursor visible:
LOCATE NUMOPTIONS + 8, LEFTCOLUMN + 27, 1

Choice$ = UCASE$(INPUT$(1)) ' Get the user's choice and see
Selection = INSTR(Option$, Choice$) ' if it's one of the menu options.

' User chose one of the sorting procedures:
IF (Selection >= 1) AND (Selection <= NUMSORTS) THEN
Reinitialize ' Rescramble the bars.
LOCATE , , 0 ' Make the cursor invisible.
Foreground = 0 ' Set reverse-video values.
Background = 7
StartTime = TIMER ' Record the starting time.
END IF

' Branch to the appropriate procedure depending on the key typed:
SELECT CASE Choice$
CASE "I"
InsertionSort
CASE "B"
BubbleSort
CASE "H"
HeapSort
CASE "E"
ExchangeSort
CASE "S"
ShellSort
CASE "Q"
QuickSort 1, MaxRow
CASE "C"
CombSort
CASE ">"

' Decrease pause length to speed up sorting time, then redraw
' the menu to clear any timing results (since they won't compare
' with future results):
Pause = (2 * Pause) / 3
BoxInit

CASE "<"

' Increase pause length to slow down sorting time, then redraw
' the menu to clear any timing results (since they won't compare
' with future results):
Pause = (3 * Pause) / 2
BoxInit

CASE "T"
ToggleSound 12, LEFTCOLUMN + 12

CASE Escape$

' User pressed ESC, so exit this procedure and return to
' module level:
EXIT DO

CASE ELSE

' Invalid key
END SELECT

IF (Selection >= 1) AND (Selection <= NUMSORTS) THEN
Foreground = MaxColors ' Turn off reverse video.
Background = 0
ElapsedTime 0 ' Print final time.
END IF

LOOP

END SUB

' =============================== SwapBars ===================================
' Calls PrintOneBar twice to switch the two bars in Row1 and Row2,
' then calls the ElapsedTime procedure.
' ============================================================================
'
SUB SwapBars (Row1, Row2) STATIC
PrintOneBar Row1
PrintOneBar Row2
ElapsedTime Row1
END SUB

' ============================== ToggleSound =================================
' Reverses the current value for NoSound, then prints that value next
' to the "Toggle Sound" option on the sort menu.
' ============================================================================
'
SUB ToggleSound (Row, Column) STATIC
NoSound = NOT NoSound
LOCATE Row, Column
IF NoSound THEN
PRINT ": OFF";
ELSE
PRINT ": ON ";
END IF
END SUB
Reply
#18
Hi:

The C runtime version of qsort very fast and simple to use. FreeBASIC uses the C runtime in its internal code, so there are no added libs or dlls.

I will make a sample later, for testing, but basically you include the CRT.BI and you are looking at one line of code.

QSORT(@myarray(0),elements,8,@strcmp)

I expect this will solve your speed problems.

Have fun

Garvan

EDIT:

Sorry, I can’t download GDSL lib to test the code posted by v3cz0r (link broken?). I got the docs, so I will looks at what it has to offer and try again later.

I get 6 seconds for FB quicksort, and 2.4 seconds for the C runtime qsort.

Have fun

Garvan
Reply
#19
I can't download the GDSL.lib either. I'm tring from http://freesoftware.fsf.org/download/gdsl/.

Anybody got another way to get this? Email maybe?

Dean@cct.com
Reply
#20
You have to build it yourself, there's no binaries, but it will be included as a static lib in 0.13..

But you should try what Sisophon2001 said, crt's qsort() needs no aux tables, so it would be easier to use and fast enough for strings <= 8 bytes, as a ptr is 4 bytes long anyways..
Reply


Forum Jump:


Users browsing this thread: 1 Guest(s)