Skip to content

Commit 130875e

Browse files
committed
Update CSVinterface.cls
1 parent d0aea25 commit 130875e

File tree

1 file changed

+3
-4
lines changed

1 file changed

+3
-4
lines changed

src/CSVinterface.cls

Lines changed: 3 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -303,7 +303,7 @@ Attribute DumpToArray.VB_UserMemId = 0
303303
End Sub
304304
Public Sub DumpToSheet(Optional WBookName As String, _
305305
Optional SheetName As String, _
306-
Optional RngName As String = "A1")
306+
Optional rngName As String = "A1")
307307
Attribute DumpToSheet.VB_Description = "Dumps the CSV data from the current instance to an Excel Worksheet."
308308
Dim WBook As Workbook
309309
Dim OutputSheet As Worksheet
@@ -330,7 +330,7 @@ Attribute DumpToSheet.VB_Description = "Dumps the CSV data from the current inst
330330
End If
331331
'@------------------------------------------------------
332332
'Set the target Range
333-
Set OutputRange = OutputSheet.Range(RngName) _
333+
Set OutputRange = OutputSheet.Range(rngName) _
334334
.Resize _
335335
( _
336336
UBound(P_CSV_DATA, 1) - LBound(P_CSV_DATA, 1) + 1, _
@@ -1277,7 +1277,6 @@ Private Sub ParseCriticalCSV(ByRef csvText As String, _
12771277
SplittedToken = False 'Restart Token status
12781278
tmpCSV(index) = vbNullString
12791279
index = index + 1&
1280-
If index <= MaxIndex Then LenCurrentIndex = LenB(tmpCSV(index))
12811280
OverStringPointer = 1&
12821281
Else
12831282
If SplittedToken Then 'Store the Left most Token portion from the current Index
@@ -1317,7 +1316,6 @@ Private Sub ParseCriticalCSV(ByRef csvText As String, _
13171316
- TokenBeginningPos + 1)
13181317
tmpCSV(index) = vbNullString
13191318
index = index + 1&
1320-
If index <= MaxIndex Then LenCurrentIndex = LenB(tmpCSV(index))
13211319
OverStringPointer = 1&
13221320
End If
13231321
End If
@@ -1336,6 +1334,7 @@ Private Sub ParseCriticalCSV(ByRef csvText As String, _
13361334
'@----------------------------------------------------------------------------
13371335
'Skip lines if needed
13381336
SkipUnwantedLines index, MaxIndex, tmpCSV
1337+
If index <= MaxIndex Then LenCurrentIndex = LenB(tmpCSV(index))
13391338
Loop
13401339
If ImportDepth <> RecordsCount Then 'There are empty index in the array
13411340
ReDim tmpOutputArray(0 To RecordsCount - 1, 0 To FieldsAmount - 1)

0 commit comments

Comments
 (0)