GST TDL 2019 | Report with Supplier Details

IT WILL HELP YOU TO GENERATE GST REPORT

 People are so amazing and search the path to  simplify there work. And for a business we use accounting software. And in this segment Tally is most popular because of it’s simplicity. For making it’s more simple we use TDL files for Tally. I have something special for you. This is the TDL file for Tally to do work in simple way. We generate monthly or weekly reports for sale or purchase data to filling our GST returns. Sometime we need information like GST number and  State there we supplied our material. In tally when generate report of sale or purchase data , there shows all details with GST number, Taxes etc, but we find the State is missing in our report.
By adding this TDL in Tally you can see states in report, and can import this data into Excel to modified as you want.

How to use TDL file : 

By this TDL file your work will become easy and it save your lots of time. By these simple steps you can add it in Tally : 
1. Download the TDL file from provided link
2. Right click on TDL File.
3. Go to Property.
4. Then go to Security.
5. Copy the path
6. Open Tally – Open any company, that you want to work.
7. Press – F12
8. Go to Product & Fetures
9. Press F4
10. Paste the path (Alt+Ctrl+V) in empty box and press Enter key.
(To see the report go to Sales register)
For download this TDL go with below download link : 

Tally ERP9 TDL 2018 | Customer Wise Stock Report

BECOME MASTER IN REPORTING

We know that reporting is most important part of a business because if you not know what is your sale and earnings, you can not go for long.
In a business Tally is most usable Accounting software and very simple. We can make it more simple with Tally TDL files.
Today I have something special for your Tally.
By this you can generate reports of customers with products sale. In this you can see the customer wise product sales. Which customer take which product more. So you can manage your inventory and increase your product sale.
This report show you customer name with there various purchases within a specified period.

To load this TDL file follow below steps:

1. Download the TDL file from provided link
2. Right click on TDL File.
3. Go to Property.
4. Then go to Security.
5. Copy the path
6. Open Tally – Open any company, that you want to work.
7. Press – F12
8. Go to Product & Fetures
9. Press F4
10. Paste the path (Alt+Ctrl+V) in empty box and press Enter key.
For more details watch above video
You can download it with this link : 

COMBINE Two Sheets and Filter DUPLICATES

MERGE TWO SHEETS IN ONE

This VBA enabled excel sheet merge your data into one sheet with unique and duplicates names.
Our mostly work we do in excel. In excel some we can do advanced work through it’s VBA coding.
After work with some simple coding of VBA we can do our important works in very simple way.
In this workbook if have two sheets containing different data, can merge both sheets with unique and duplicate values. 
These are some simple coding with this you can make your own Data Merger Sheet:
Sub MergeLists()
Dim rA As Range
Dim rB As Range
Dim rCell As Range
Dim lCount As Long
Dim colMerge As New Collection

On Error GoTo ErrorHandle

Application.ScreenUpdating = False
Worksheets(1).Activate
Set rA = Range(Range(“A1”), Range(“A1”).End(xlDown))
Worksheets(2).Activate
Set rB = Range(Range(“A1”), Range(“A1”).End(xlDown))

On Error Resume Next

For Each rCell In rA
   colMerge.Add rCell.Value, rCell.Value
Next
For Each rCell In rB
   colMerge.Add rCell.Value, rCell.Value
Next

On Error GoTo ErrorHandle

Workbooks.Add

With colMerge
   For lCount = 1 To .Count
      Range(“A1”).Offset(lCount – 1).Value = .Item(lCount)
   Next
End With
Set rA = Range(Range(“A1”), Range(“A1”).End(xlDown))
rA.Sort Key1:=Range(“A1”)

BeforeExit:
Set rA = Nothing
Set rB = Nothing
Set rCell = Nothing
Set colMerge = Nothing
Application.ScreenUpdating = True
Exit Sub
ErrorHandle:
MsgBox Err.Description & ” Procedure MergeLists”
Resume BeforeExit
End Sub

Sub UniqueAndDuplicates()
Dim rA As Range
Dim rB As Range
Dim rCell As Range
Dim vResult()
Dim vResult2()
Dim lCount As Long
Dim lCount2 As Long

On Error GoTo ErrorHandle

Application.ScreenUpdating = False

ThisWorkbook.Worksheets(1).Activate

Set rA = Range(Range(“A1”), Range(“A1”).End(xlDown))
Set rB = Worksheets(2).Range(“A1”)
Set rB = Range(rB, rB.End(xlDown))

ReDim vResult(1 To rA.Count + rB.Count, 1 To 1)
ReDim vResult2(1 To rA.Count + rB.Count, 1 To 1)
For Each rCell In rA
   With rCell
      If WorksheetFunction.CountIf(rB, .Value) = 0 Then
         lCount = lCount + 1
         vResult(lCount, 1) = .Value
      Else
         lCount2 = lCount2 + 1
         vResult2(lCount2, 1) = .Value
      End If
   End With
Next
For Each rCell In rB
   With rCell
      If WorksheetFunction.CountIf(rA, .Value) = 0 Then
         lCount = lCount + 1
         vResult(lCount, 1) = .Value
      Else
         lCount2 = lCount2 + 1
         vResult2(lCount2, 1) = .Value
      End If
   End With
Next

If lCount > 0 Then
   Set rCell = Range(“J2”).Resize(UBound(vResult), 1)
   rCell.Value = vResult()
   With Range(“J1”)
      .Value = “Unique:”
      .Font.Bold = True
   End With
Else
   MsgBox “All values are present in both tables.”
End If
If lCount2 > 0 Then
   Set rCell = Range(“K2”).Resize(UBound(vResult2), 1)
   rCell.Value = vResult2()
   With Range(“K1”)
      .Value = “Duplicates:”
      .Font.Bold = True
   End With
Else
   MsgBox “There were no duplicate values.”
End If

BeforeExit:
Set rA = Nothing
Set rB = Nothing
Set rCell = Nothing
Erase vResult
Erase vResult2
Application.ScreenUpdating = True
Exit Sub
ErrorHandle:
MsgBox Err.Description & ” Procedure UniqueAndDuplicates”
End Sub
How to use this coding :

1.Open Excel
2. Press Alt+F11
3. Create Module
4. Paste the code
5. Create command buttons 
For detailed information watch the above video 
To download the sheet please go through below download link : 
 

How to Import Bill Wise Entries with Multiple References in Tally ERP 9

NOW WE CAN IMPORT EXCEL DATA INTO TALLY WITH MULTIPLE REFERENCES

We take all type entries related to sales, purchase, debit note , credit note, payment, receipt etc to maintain our business perfectly. But some time when we reconcile or or take customer outstanding we find that some transactions not match. And we can not take decision that which invoices are pending to collect from customer or paid to customer.
So we maintain bill wise details of customer. In tally it has very nice feature to add bill wise details of customers and other ledgers.
But sometime when our entries are so high in quantity and not possible to enter manually, we can use Excel to Tally software to take bulk entries.
Now you can enter bulk entries with there won multiple references.
Now Excel2Tally has this feature to enter bill wise entries.
For more detail watch above video.
You can download it with below download Link : 

How to Use :

1. Download the file with provided link.
2. It is ready to use software made in Excel platform, No need to install
3. Double click the file to open it.
3. You can use any sheet to take entries according to you
4. Bank Voucher sheet and Accounting Invoice sheet You can use to take entries with bill references.
5. After filling detail click on generate button to create XML file.
6. Import XML file into Tally 
You can contact me at +91-9131810293 or mail me at Learnwells@outlook.com
For more excel to tally software go to Excel to Tally section of this website : https://www.learnwells.com/p/tally.html

GST TDL FOR TALLY ERP 9 | MONTHLY SUMMARY

NOW GST IN INDIA

From last two years GST comes in India and GST is most important part of Indian businesses.
Before it there are lots of taxes as VAT, Excise etc. But now GST only one tax is here.
And we file monthly return of our taxes like GSTR1, GST 3B etc. To do business we use accounting software like Tally. And Tally is most famous in India because of its simplicity. By adding some TDL file in tally we can make it more simple for our work. In this segment I have something special for you. 
By this TDL file you can generate your monthly taxes easily.
You can generate these report for your sales, purchase, debit note, credit note etc with there tax details.
It is very useful TDL you can download it with below link : 

How to use TDL File : 

1. Download the TDL file from provided link
2. Right click on TDL File.
3. Go to Property.
4. Then go to Security.
5. Copy the path
6. Open Tally – Open any company, that you want to work.
7. Press – F12
8. Go to Product & Fetures
9. Press F4
10. Paste the path (Alt+Ctrl+V) in empty box and press Enter key
You can use it lifetime for free.
For more detail watch above video

EXCEL TO TALLY – LITE | Import multiple ledger voucher

THIS EXCEL TO TALLY- LITE SOFTWARE HELP YOU TO EXPORT EXCEL DATA INTO TALLY ERP OR OTHER VERSION OF TALLY LIKE TALLY 7.2, TALLY ERP 9, TALLY ERP, OR GST READY TALLY THROUGH EXCEL SHEET. IT IS VERY USEFUL SOFTWARE AND SAVE YOUR LOTS OF TIME. NO RENEWAL REQUIRED.
* VIA THIS YOU CAN ENTER LOTS OF LEDGERS IN ONE VOUCHER.
(AS IF YOU PAY SALARY TO 400 PEOPLE WITH ONE CHEQUE , YOU CAN ENTER THESE ALL NAMES IN ONE VOUCHER.)
* YOU CAN IMPORT ALL TYPE OF VOUCHERS WITHOUT STOCK ITEM.
IT WILL BE VERY HELPFUL TO TAKE JOURNAL, PAYMENT , RECEIPT, CONTRA, DEBIT NOTE, CREDIT NOTE, SALES, PURCHASE VOUCHERS WITH MULTIPLE DR. CR. LEDGERS.
Just enter voucher number day month and narration. in voucher sheet
Enter customers ledgers and amount in ref sheet .
Generate XML file by clicking Generate button.
Goto Tally Import xml file.
YOUR ALL VOUCHER ENTRIES WILL BE IMPORTED WITH THOUSAND OF LEDGERS IN ONE VOUCHER.
This utility can be used for GST Sales and GST purchase vouchers also.
By this You can add lots of ledgers in voucher. Like :
BASIC 28%    CGST 14%  SGST 14%
BASIC 18 %   CGST 9%  SGST 9%
BASIC 12 %  CGST6%  SGST 6%
BASIC 5%      CGST2.5%  SGST 2.5%
NIL RATED AMOUNT
TRANSPORTATION CHARGES
ROUND OFF.
OTHERS
YOU CAN ENTER ALL THESE LEDGERS TYPE IN ONE VOUCHER. EVEN 5000 LEDGERS IN ONE VOUCHER.
*This is the first  utility that can import these type of Vouchers.
Don’t Miss it , You can download by click on this link : https://imojo.in/gaeofm

EXCEL VBA – SEARCH ALL

SEARCH ANYTHING WITH ANY WORD

Excel make our work very simple, and if you use some VBA coding, it become more reliable to your work. In excel we make reports and calculate it. You can do all things that you want to do in excel.
Today I have something special for you. Now you can find any value or name in easy way with this simple coding :
Option Explicit
Option Compare Text

Sub Show_FindAll_Form()
    f_FindAll.Show
End Sub

””””””””””””””””””””””””””””””””””””””””””
‘www.learnwells.com
””””””””””””””””””””””””””””””””””””””””””

Function FindAll(SearchRange As Range, _
                FindWhat As Variant, _
               Optional LookIn As XlFindLookIn = xlValues, _
                Optional LookAt As XlLookAt = xlWhole, _
                Optional SearchOrder As XlSearchOrder = xlByRows, _
                Optional MatchCase As Boolean = False, _
                Optional BeginsWith As String = vbNullString, _
                Optional EndsWith As String = vbNullString, _
                Optional BeginEndCompare As VbCompareMethod = vbTextCompare) As Range
””””””””””””””””””””””””””””””””””””””””””’
‘ FindAll
””””””””””””””””””””””””””””””””””””””””””’

Dim FoundCell As Range
Dim FirstFound As Range
Dim LastCell As Range
Dim ResultRange As Range
Dim XLookAt As XlLookAt
Dim Include As Boolean
Dim CompMode As VbCompareMethod
Dim Area As Range
Dim MaxRow As Long
Dim MaxCol As Long
Dim BeginB As Boolean
Dim EndB As Boolean


CompMode = BeginEndCompare
If BeginsWith <> vbNullString Or EndsWith <> vbNullString Then
    XLookAt = xlPart
Else
    XLookAt = LookAt
End If

‘ this loop in Areas is to find the last cell
‘ of all the areas. That is, the cell whose row
‘ and column are greater than or equal to any cell
‘ in any Area.
For Each Area In SearchRange.Areas
    With Area
        If .Cells(.Cells.Count).Row > MaxRow Then
            MaxRow = .Cells(.Cells.Count).Row
        End If
        If .Cells(.Cells.Count).Column > MaxCol Then
            MaxCol = .Cells(.Cells.Count).Column
        End If
    End With
Next Area
Set LastCell = SearchRange.Worksheet.Cells(MaxRow, MaxCol)


‘On Error Resume Next
On Error GoTo 0
Set FoundCell = SearchRange.Find(What:=FindWhat, _
        After:=LastCell, _
        LookIn:=LookIn, _
        LookAt:=XLookAt, _
        SearchOrder:=SearchOrder, _
        MatchCase:=MatchCase)

If Not FoundCell Is Nothing Then
    Set FirstFound = FoundCell
    ‘Set ResultRange = FoundCell
    ‘Set FoundCell = SearchRange.FindNext(after:=FoundCell)
    Do Until False ‘ Loop forever. We’ll “Exit Do” when necessary.
        Include = False
        If BeginsWith = vbNullString And EndsWith = vbNullString Then
            Include = True
        Else
            If BeginsWith <> vbNullString Then
                If StrComp(Left(FoundCell.Text, Len(BeginsWith)), BeginsWith, BeginEndCompare) = 0 Then
                    Include = True
                End If
            End If
            If EndsWith <> vbNullString Then
                If StrComp(Right(FoundCell.Text, Len(EndsWith)), EndsWith, BeginEndCompare) = 0 Then
                    Include = True
                End If
            End If
        End If
        If Include = True Then
            If ResultRange Is Nothing Then
                Set ResultRange = FoundCell
            Else
                Set ResultRange = Application.Union(ResultRange, FoundCell)
            End If
        End If
        Set FoundCell = SearchRange.FindNext(After:=FoundCell)
        If (FoundCell Is Nothing) Then
            Exit Do
        End If
        If (FoundCell.Address = FirstFound.Address) Then
            Exit Do
        End If

    Loop
End If
    
Set FindAll = ResultRange

End Function

Function FindAllOnWorksheets(InWorkbook As Workbook, _
                InWorksheets As Variant, _
                SearchAddress As String, _
                FindWhat As Variant, _
                Optional LookIn As XlFindLookIn = xlValues, _
                Optional LookAt As XlLookAt = xlWhole, _
                Optional SearchOrder As XlSearchOrder = xlByRows, _
                Optional MatchCase As Boolean = False, _
                Optional BeginsWith As String = vbNullString, _
                Optional EndsWith As String = vbNullString, _
                Optional BeginEndCompare As VbCompareMethod = vbTextCompare) As Variant
””””””””””””””””””””””””””””””””””””””””””””’
‘www.learnwells.com
””””””””””””””””””””””””””””””””””””””””””””’

Dim WSArray() As String
Dim ws As Worksheet
Dim Wb As Workbook
Dim ResultRange() As Range
Dim WSNdx As Long
Dim R As Range
Dim SearchRange As Range
Dim FoundRange As Range
Dim WSS As Variant
Dim N As Long


”””””””””””””””””””””’
‘ Determine what Workbook to search.
”””””””””””””””””””””’
If InWorkbook Is Nothing Then
    Set Wb = ActiveWorkbook
Else
    Set Wb = InWorkbook
End If

”””””””””””””””””””””’
‘ Determine what sheets to search
”””””””””””””””””””””’
If IsEmpty(InWorksheets) = True Then
    ”””””””””””””””””””””
    ‘ Empty. Search all sheets.
    ”””””””””””””””””””””
    With Wb.Worksheets
        ReDim WSArray(1 To .Count)
        For WSNdx = 1 To .Count
            WSArray(WSNdx) = .item(WSNdx).Name
        Next WSNdx
    End With

Else
    ”””””””””””””””””””’
    ‘ If Object, ensure it is a Worksheet
    ‘ object.
    ”””””””””””””””””””
    If IsObject(InWorksheets) = True Then
        If TypeOf InWorksheets Is Excel.Worksheet Then
            ”””””””””””””””””””””
            ‘ Ensure Worksheet is in the WB workbook.
            ”””””””””””””””””””””
            If StrComp(InWorksheets.Parent.Name, Wb.Name, vbTextCompare) <> 0 Then
                ”””””””””””””””
                ‘ Sheet is not in WB. Get out.
                ”””””””””””””””
                Exit Function
            Else
                ”””””””””””””””
                ‘ Same workbook. Set the array
                ‘ to the worksheet name.
                ”””””””””””””””
                ReDim WSArray(1 To 1)
                WSArray(1) = InWorksheets.Name
            End If
        Else
            ””””””””””””””””””’
            ‘ Object is not a Worksheet. Get out.
            ””””””””””””””””””’
        End If
    Else
        ”””””””””””””””””””””’
        ‘ Not empty, not an object. Test for array.
        ”””””””””””””””””””””’
        If IsArray(InWorksheets) = True Then
            ”””””””””””””””””””’
            ‘ It is an array. Test if each element
            ‘ is an object. If it is a worksheet
            ‘ object, get its name. Any other object
            ‘ type, get out. Not an object, assume
            ‘ it is the name.
            ””””””””””””””””””””
            ReDim WSArray(LBound(InWorksheets) To UBound(InWorksheets))
            For WSNdx = LBound(InWorksheets) To UBound(InWorksheets)
                If IsObject(InWorksheets(WSNdx)) = True Then
                    If TypeOf InWorksheets(WSNdx) Is Excel.Worksheet Then
                        ”””””””””””””””””””
                        ‘ It is a worksheet object, get name.
                        ”””””””””””””””””””
                        WSArray(WSNdx) = InWorksheets(WSNdx).Name
                    Else
                        ””””””””””””””””
                        ‘ Other type of object, get out.
                        ””””””””””””””””
                        Exit Function
                    End If
                Else
                    ”””””””””””””””””””””’
                    ‘ Not an object. If it is an integer or
                    ‘ long, assume it is the worksheet index
                    ‘ in workbook WB.
                    ”””””””””””””””””””””’
                    Select Case UCase(TypeName(InWorksheets(WSNdx)))
                        Case “LONG”, “INTEGER”
                            Err.Clear
                            ”””””””””””””””””’
                            ‘ Ensure integer if valid index.
                            ”””””””””””””””””’
                            Set ws = Wb.Worksheets(InWorksheets(WSNdx))
                            If Err.Number <> 0 Then
                                ”””””””””””””””’
                                ‘ Invalid index.
                                ”””””””””””””””’
                                Exit Function
                            End If
                            ””””””””””””””””””
                            ‘ Valid index. Get name.
                            ””””””””””””””””””
                            WSArray(WSNdx) = Wb.Worksheets(InWorksheets(WSNdx)).Name
                        Case “STRING”
                            Err.Clear
                            ””””””””””””””””””’
                            ‘ Ensure valid name.
                            ””””””””””””””””””’
                            Set ws = Wb.Worksheets(InWorksheets(WSNdx))
                            If Err.Number <> 0 Then
                                ””””””””””””””””’
                                ‘ Invalid name, get out.
                                ””””””””””””””””’
                                Exit Function
                            End If
                            WSArray(WSNdx) = InWorksheets(WSNdx)
                    End Select
                End If
                ‘WSArray(WSNdx) = InWorksheets(WSNdx)
            Next WSNdx
        Else
            ””””””””””””””””””””””
            ‘ InWorksheets is neither an object nor an
            ‘ array. It is either the name or index of
            ‘ the worksheet.
            ””””””””””””””””””””””
            Select Case UCase(TypeName(InWorksheets))
                Case “INTEGER”, “LONG”
                    ”””””””””””””””””””’
                    ‘ It is a number. Ensure sheet exists.
                    ”””””””””””””””””””’
                    Err.Clear
                    Set ws = Wb.Worksheets(InWorksheets)
                    If Err.Number <> 0 Then
                        ”””””””””””””””’
                        ‘ Invalid index, get out.
                        ”””””””””””””””’
                        Exit Function
                    Else
                        WSArray = Array(Wb.Worksheets(InWorksheets).Name)
                    End If
                Case “STRING”
                    ”””””””””””””””””””””””””’
                    ‘ See if the string contains a ‘:’ character. If
                    ‘ so, the InWorksheets contains a string of multiple
                    ‘ worksheets.
                    ”””””””””””””””””””””””””’
                    If InStr(1, InWorksheets, “:”, vbBinaryCompare) > 0 Then
                        ”””””””””””””””””””””
                        ‘ “:” character found. split apart sheet
                        ‘ names.
                        ”””””””””””””””””””””
                        WSS = Split(InWorksheets, “:”)
                        Err.Clear
                        N = LBound(WSS)
                        If Err.Number <> 0 Then
                            ””””””””””””””’
                            ‘ Unallocated array. Get out.
                            ””””””””””””””’
                            Exit Function
                        End If
                        If LBound(WSS) > UBound(WSS) Then
                            ””””””””””””””’
                            ‘ Unallocated array. Get out.
                            ””””””””””””””’
                            Exit Function
                        End If
                            
                                                
                        ReDim WSArray(LBound(WSS) To UBound(WSS))
                        For N = LBound(WSS) To UBound(WSS)
                            Err.Clear
                            Set ws = Wb.Worksheets(WSS(N))
                            If Err.Number <> 0 Then
                                Exit Function
                            End If
                            WSArray(N) = WSS(N)
                         Next N
                    Else
                        Err.Clear
                        Set ws = Wb.Worksheets(InWorksheets)
                        If Err.Number <> 0 Then
                            ””””””””””””””””’
                            ‘ Invalid name, get out.
                            ””””””””””””””””’
                            Exit Function
                        Else
                            WSArray = Array(InWorksheets)
                        End If
                    End If
            End Select
        End If
    End If
End If
”””””””””””””””””””””’
‘ Ensure SearchAddress is valid
”””””””””””””””””””””’
On Error Resume Next
For WSNdx = LBound(WSArray) To UBound(WSArray)
    Err.Clear
    Set ws = Wb.Worksheets(WSArray(WSNdx))
    ””””””””””””””””””””
    ‘ Worksheet does not exist
    ””””””””””””””””””””
    If Err.Number <> 0 Then
        Exit Function
    End If
    Err.Clear
    Set R = Wb.Worksheets(WSArray(WSNdx)).Range(SearchAddress)
    If Err.Number <> 0 Then
        ””””””””””””””””””
        ‘ Invalid Range. Get out.
        ””””””””””””””””””
        Exit Function
    End If
Next WSNdx

””””””””””””””””””””
‘ SearchAddress is valid for all sheets.
‘ Call FindAll to search the range on
‘ each sheet.
””””””””””””””””””””
ReDim ResultRange(LBound(WSArray) To UBound(WSArray))
For WSNdx = LBound(WSArray) To UBound(WSArray)
    Set ws = Wb.Worksheets(WSArray(WSNdx))
    Set SearchRange = ws.Range(SearchAddress)
    Set FoundRange = FindAll(SearchRange:=SearchRange, _
                    FindWhat:=FindWhat, _
                    LookIn:=LookIn, LookAt:=LookAt, _
                    SearchOrder:=SearchOrder, _
                    MatchCase:=MatchCase, _
                    BeginsWith:=BeginsWith, _
                    EndsWith:=EndsWith)
    
    If FoundRange Is Nothing Then
        Set ResultRange(WSNdx) = Nothing
    Else
        Set ResultRange(WSNdx) = FoundRange
    End If
Next WSNdx

FindAllOnWorksheets = ResultRange

End Function

Just copy the above code and paste it to your excel sheet. 
Open your excel sheet
Press Alt+F11
Create a module and paste the code on it.
For more detail please watch the above video.
Also you can download this sheet with below download link : 

TEXT TO EXCEL | EXCEL VBA

BY THIS VBA ENABLED EXCEL SHEET YOU CAN TRANSFER TEXT FILE DIRECTLY IN EXCEL WITH THERE OWN COLUMNS

VBA Coding make our work very easy. Write one and use lifetime.
With this coding you can select your text file which you want to import in excel sheet.
It will divide texts to separate columns in excel. If you have rich text files, it is for you.
Just paste below simple coding in your excel sheet VBA modules and create a macro enabled button to import text to excel : 
Option Explicit
Sub ImportTextFile()
Dim vFileName

On Error GoTo ErrorHandle

‘WWW.LEARNWELLS.COM

vFileName = Application.GetOpenFilename(“Text Files (*.txt),*.txt”)


If vFileName = False Or Right(vFileName, 3) <> “txt” Then
   GoTo BeforeExit
End If


Application.ScreenUpdating = False


Workbooks.OpenText Filename:=vFileName, _
    Origin:=xlMSDOS, StartRow:=1, DataType:=xlDelimited, TextQualifier:= _
    xlDoubleQuote, ConsecutiveDelimiter:=False, Tab:=False, Semicolon:=True, _
    Comma:=False, Space:=False, Other:=False, _
    TrailingMinusNumbers:=True, Local:=True


Columns(“A:A”).EntireColumn.AutoFit

BeforeExit:
Application.ScreenUpdating = True
Exit Sub
ErrorHandle:
MsgBox Err.Description
Resume BeforeExit
End Sub

It is very short code and very useful for your excel and also for your learning.
You can download the Excel sheet with VBA code with below download Link :


  

Email Sender | Free Utility

NOW SEND BULK EMAILS 

Email is most import part of Internet and our business. Without it you can not do your business properly. In the past we were send letters to our loved one and also use it for business with manual writing on paper. And it was take so many time to received by another person. But now you just type in computer or in mobile and send it with one click, and it received within a second by another person.
Now you can send lots of Emails to different persons with one click by this simple vba coding. Also You can select all Email types like, outlook, gmail, yahoo, hotmail etc. with the attachments.

In this you need create three modules and also some coding for sheets.
You can download it with below link : 

You can see its coding with press Alt+F11
How to use the file, please watch above video.

EXCEL TO TALLY – ATTENDANCE

Payroll accounting in Tally software now most easy process and you can maintain Salary, Salary Slips, Employee Details, Attendance, Salary Payments etc. easily.

In a firm, Company or personal business if you have employee and maintain daily or monthly salary, then it is for you. 
When book salary of employees, you need to maintain employee details, working hours or day, there bank details, PF, ESIC, and payment details etc.
And all in these things there is most important roll of attendance. If you not maintain attendance, you never make correct salary. So we maintain excel sheets etc to provide correct salary to employees.
But in Tally you can book all details related to salary in easy way.
If you use tally I have Excel to Tally attendance software for you.
By this you can book attendance directly in your tally with this excel sheet.

This sheet is very simple. Just copy and paste or write your employee names and there attendance details like – absent , present, leave etc and write voucher date. By pressing generate button you got xml file of your filling data, that you can import in your tally.

How to use Excel2Tally – Attendance sheet :

1. Open the utility.
2. Enable Macro setting of Excel (Excel option – Trust Center – Trust Center Setting – Macro Setting – Tick on Enable all macros and press OK)
3. Fill Date and Voucher Number in Attendance Sheet.
4. Double Click on Voucher Number (You replaced in EmpAttendance Sheet)
5. Fill here Employee details and there absent or present in there own column.
6. Fill Voucher cell address (in 1st Cell like – B2)
7. Back to Attendance Sheet
8. Click on Generate

Now you got XML file named attendance (It save there where is your software)

How to import XML file in Tally : 

1. Write click on XML file that you generated
2. Goto Property – Security
3. Select and copy the path
4. Go to Tally – Import Data
5. Paste the Path (Alt + CTRL + V)
6. Press Enter

Now your attendance imported in Tally.

How to Find this Utility:

If you want this utility goto this Link https://youtu.be/_rvQjPuiYiI 
and Give your Email id in comment box. I will mail you.

For more information please watch this video :